diff --git a/.gitignore b/.gitignore new file mode 100644 index 0000000..5b6a065 --- /dev/null +++ b/.gitignore @@ -0,0 +1,4 @@ +.Rproj.user +.Rhistory +.RData +.Ruserdata diff --git a/README.md b/README.md index c399d68..9a31459 100644 --- a/README.md +++ b/README.md @@ -1,2 +1,5 @@ # journals-on-twitter -Dataset of the Twitter accoutns of scientific journals (based on the Web of Science indices SCIE, SSCI and AHCI) + +Here is a dataset of 3.485 Twitter accounts pertaining to a sample of 13.821 distinct journals listed in Web of Science’s three major indices (SCIE, SSCI and AHCI). + +The dataset is available under a Creative Commons-license (CC0). diff --git a/Summary_Statistics/activity_of_journals.R b/Summary_Statistics/activity_of_journals.R new file mode 100644 index 0000000..9b2059a --- /dev/null +++ b/Summary_Statistics/activity_of_journals.R @@ -0,0 +1,168 @@ +library(tidyverse) + +# read data +DFF <- arrow::read_parquet("Summary_Statistics\\twitter_data.parquet") + +# function for Modal value +Mode <- function(x) { + ux <- unique(x) + ux[which.max(tabulate(match(x, ux)))] +} + +DF <- DFF %>% + filter(year == 2020 | year == 2021) +# library(plyr) +# ALLNAMES <- plyr::ddply(DF, .(twitter), summarize, allnames = paste(uniquenames, collapse=";")) %>% +# separate_rows(allnames) %>% +# distinct() %>% +# select(twitter) %>% +# group_by(twitter) %>% +# count() +# colnames(ALLNAMES) <- c("twitter", "total_names") +# ALLREP <- plyr::ddply(DF, .(twitter), summarize, allnames_rep = paste(uniquenames_rep, collapse=";")) %>% +# separate_rows(allnames_rep) %>% +# distinct() %>% +# select(twitter) %>% +# group_by(twitter) %>% +# count() +# colnames(ALLREP) <- c("twitter", "total_names_rep") +# ALLRT <- plyr::ddply(DF, .(twitter), summarize, allnames_rt = paste(uniquenames_rt, collapse=";")) %>% +# separate_rows(allnames_rt) %>% +# distinct() %>% +# select(twitter) %>% +# group_by(twitter) %>% +# count() +# colnames(ALLRT) <- c("twitter", "total_names_rt") +# ALLMEN <- plyr::ddply(DF, .(twitter), summarize, allnames_mentions = paste(uniquenames_mentions, collapse=";")) %>% +# separate_rows(allnames_mentions) %>% +# distinct() %>% +# select(twitter) %>% +# group_by(twitter) %>% +# count() +# colnames(ALLMEN) <- c("twitter", "total_names_mentions") +# detach(package:plyr) +DF$tweets_total <- as.numeric(DF$tweets_total) +DF <- DF %>% + select(-account_created_date, -year, -starts_with("uniquenames")) %>% + group_by(twitter) %>% + mutate(totaltw = sum(tweets_total)) + +JJ <- read_csv("twitter_accounts_of_journals.csv") +JJ <- JJ %>% + pivot_longer(cols = c("ahci", "ssci", "scie"), + names_to = "wos_index") %>% + filter(value == 1) %>% + select(-value) +TT <- left_join(JJ, DF) +TT <- TT %>% + mutate(has_twitter = ifelse(is.na(twitter), 0 , 1)) + +TT <- TT %>% + mutate(wos_index = case_when( + wos_index == "ahci" ~ "AHCI", + wos_index == "ssci" ~ "SSCI", + wos_index == "scie" ~ "SCIE", +)) + + +# =========== +# Summary Statistics +# =========== +# by index +TT %>% + filter(!is.na(totaltw)) %>% + select(twitter, totaltw, wos_index) %>% + distinct() %>% + group_by(wos_index) %>% + summarise( + avg = mean(totaltw, na.rm = TRUE) / 2, + med = median(totaltw, na.rm = TRUE) / 2, + mode = Mode(totaltw) / 2, + sd = sd(totaltw, na.rm = TRUE) / 2, + min = min(totaltw, na.rm = TRUE) / 2, + q1 = quantile(totaltw, probs = 0.25, na.rm = TRUE) / 2, + q3 = quantile(totaltw, probs = 0.75, na.rm = TRUE) / 2, + max = max(totaltw, na.rm = TRUE) / 2 + ) + +# total +TT %>% + filter(!is.na(totaltw)) %>% + select(twitter, totaltw) %>% + distinct() %>% + summarise( + avg = mean(totaltw, na.rm = TRUE) / 2, + med = median(totaltw, na.rm = TRUE) / 2, + mode = Mode(totaltw) / 2, + sd = sd(totaltw, na.rm = TRUE) / 2, + min = min(totaltw, na.rm = TRUE) / 2, + q1 = quantile(totaltw, probs = 0.25, na.rm = TRUE) / 2, + q3 = quantile(totaltw, probs = 0.75, na.rm = TRUE) / 2, + max = max(totaltw, na.rm = TRUE) / 2 + ) + +# most prolific accounts +TT %>% + select(journal_title, totaltw) %>% + mutate(totaltw = totaltw/2) %>% + arrange(desc(totaltw)) %>% + distinct() %>% + View() + +# Tweets per year +TT %>% + select(twitter, totaltw) %>% + mutate(totaltw = totaltw/2) %>% + distinct() %>% + filter(!is.na(totaltw)) %>% + summarise(totaltw = sum(totaltw)) + +# =========== +# graph +# =========== + +TT <- TT %>% + distinct(twitter, totaltw, wos_index) + +ann_label <- data.frame(wos_index = c("AHCI", "SCIE", "SSCI"), + label = c( + median(TT$totaltw[TT$wos_index == "AHCI"], na.rm = T)/2, + median(TT$totaltw[TT$wos_index == "SCIE"], na.rm = T)/2, + median(TT$totaltw[TT$wos_index == "SSCI"], na.rm = T)/2 + )) +ann_label$label = paste0("Median: ", ann_label$label) + +TT %>% + select(twitter, totaltw, wos_index) %>% + distinct() %>% + ggplot(aes(y = totaltw / 2)) + + geom_histogram(binwidth = 5) + + # geom_hline(yintercept = median(TT$totaltw, na.rm = T), + # linetype = "dashed") + + geom_hline(data = filter(TT, wos_index == "AHCI"), + aes(yintercept = median(totaltw/2, na.rm = T)), + linetype = "dashed") + + geom_hline(data = filter(TT, wos_index == "SCIE"), + aes(yintercept = median(totaltw/2, na.rm = T)), + linetype = "dashed") + + geom_hline(data = filter(TT, wos_index == "SSCI"), + aes(yintercept = median(totaltw/2, na.rm = T)), + linetype = "dashed") + + geom_text(data = ann_label, + aes(label = label), x = 50, y = ifelse(ann_label$wos_index == "SCIE", 270, + ifelse(ann_label$wos_index == "SSCI", 200, 180)), + size = 3) + + xlab("Journals") + + ylab("Tweets per Year") + + theme_minimal() + + facet_wrap(~ wos_index, nrow = 3) + + theme(strip.text.x = element_text(size = 10, face = "bold", + margin = margin ( t = 5 ))) + + scale_y_continuous(breaks = seq(0, 1500, by = 100)) + + coord_flip() + +ggsave("Graph\\active_journals_histogram_by_index.png", + width = 6.8, + height = 5.0, + units = "in", + dpi = 300) diff --git a/Summary_Statistics/community_engagement.R b/Summary_Statistics/community_engagement.R new file mode 100644 index 0000000..094a223 --- /dev/null +++ b/Summary_Statistics/community_engagement.R @@ -0,0 +1,152 @@ +library(tidyverse) + +# read data +DFF <- arrow::read_parquet("Summary_Statistics\\twitter_data.parquet") + +DF <- DFF %>% + filter(year == 2020 | year == 2021) +library(plyr) +ALLNAMES <- plyr::ddply(DF, .(twitter), summarize, allnames = paste(uniquenames, collapse=";")) %>% + separate_rows(allnames) %>% + distinct() %>% + select(twitter) %>% + group_by(twitter) %>% + count() +colnames(ALLNAMES) <- c("twitter", "total_names") +ALLREP <- plyr::ddply(DF, .(twitter), summarize, allnames_rep = paste(uniquenames_rep, collapse=";")) %>% + separate_rows(allnames_rep) %>% + distinct() %>% + select(twitter) %>% + group_by(twitter) %>% + count() +colnames(ALLREP) <- c("twitter", "total_names_rep") +ALLRT <- plyr::ddply(DF, .(twitter), summarize, allnames_rt = paste(uniquenames_rt, collapse=";")) %>% + separate_rows(allnames_rt) %>% + distinct() %>% + select(twitter) %>% + group_by(twitter) %>% + count() +colnames(ALLRT) <- c("twitter", "total_names_rt") +ALLMEN <- plyr::ddply(DF, .(twitter), summarize, allnames_mentions = paste(uniquenames_mentions, collapse=";")) %>% + separate_rows(allnames_mentions) %>% + distinct() %>% + select(twitter) %>% + group_by(twitter) %>% + count() +colnames(ALLMEN) <- c("twitter", "total_names_mentions") +detach(package:plyr) +DF$tweets_total <- as.numeric(DF$tweets_total) +DF <- DF %>% + select(-account_created_date, -year, -starts_with("uniquenames")) %>% + group_by(twitter) %>% + mutate(totaltw = sum(tweets_total), + total_mentions = sum(unique_mentions), + total_rt = sum(unique_rt), + total_rep = sum(unique_rep) + ) %>% + #filter(totaltw >= 50) %>% + select(-tweets_total, -unique_mentions, -unique_rt, -unique_rep) %>% + distinct() %>% + left_join(ALLNAMES) %>% + left_join(ALLMEN) %>% + left_join(ALLREP) %>% + left_join(ALLRT) %>% + group_by(twitter) %>% + mutate(ratio = round(total_names / totaltw, 2), + ratio_mentions = round(total_names_mentions / totaltw, 2), + ratio_rep = round(total_names_rep / totaltw, 2), + ratio_rt = round(total_names_rt / totaltw, 2) + ) +rm(ALLNAMES, ALLMEN, ALLREP, ALLRT) + +JJ <- read_csv("twitter_accounts_of_journals.csv") +JJ <- JJ %>% + pivot_longer(cols = c("ahci", "ssci", "scie"), + names_to = "wos_index") %>% + filter(value == 1) %>% + select(-value) +TT <- left_join(JJ, DF) +TT <- TT %>% + mutate(has_twitter = ifelse(is.na(twitter), 0 , 1)) + +Reg <- DFF %>% + select(twitter, account_created_date) %>% + distinct() +TT <- left_join(TT, Reg) +rm(Reg) + +# prepare data +ahci <- TT %>% + filter(wos_index == "ahci") %>% + select(twitter, ratio, wos_index) %>% + filter(!is.na(twitter)) +ssci <- TT %>% + filter(wos_index == "ssci") %>% + select(twitter, ratio, wos_index) %>% + filter(!is.na(twitter)) +scie <- TT %>% + filter(wos_index == "scie") %>% + select(twitter, ratio, wos_index) %>% + filter(!is.na(twitter)) + +# create graph +rbind(ahci, ssci) %>% + rbind(scie) %>% + mutate(wos_index = case_when( + wos_index == "ahci" ~ "AHCI", + wos_index == "ssci" ~ "SSCI", + wos_index == "scie" ~ "SCIE", + )) %>% + ggplot(aes(x = ratio)) + + geom_boxplot() + + scale_fill_manual(values = c("grey", "black", "white")) + + scale_x_continuous(limits = c(0, 5)) + + theme_minimal() + + theme(axis.text.y = element_blank(), + legend.title=element_blank()) + + xlab("community engagement ratio") + + facet_wrap(~ wos_index, ncol = 1) + + theme(strip.text.x = element_text(size = 10, face = "bold", + margin = margin ( t = 5 ))) + +ggsave("Graph\\community_engagement.png", + width = 6.5, + height = 3, + units = "in", + dpi = 300) + +# Summary Statistics +Mode <- function(x) { + ux <- unique(x) + ux[which.max(tabulate(match(x, ux)))] +} + +TT %>% + select(twitter, ratio, wos_index) %>% + filter(!is.na(twitter)) %>% + group_by(wos_index) %>% + filter(!is.na(ratio)) %>% + summarise( + avg = mean(ratio, na.rm = TRUE), + med = median(ratio, na.rm = TRUE), + mode = Mode(ratio), + sd = sd(ratio, na.rm = TRUE), + min = min(ratio, na.rm = TRUE), + q1 = quantile(ratio, probs = 0.25, na.rm = TRUE), + q3 = quantile(ratio, probs = 0.75, na.rm = TRUE), + max = max(ratio, na.rm = TRUE) + ) +TT %>% + select(twitter, ratio) %>% + filter(!is.na(twitter)) %>% + filter(!is.na(ratio)) %>% + summarise( + avg = mean(ratio, na.rm = TRUE), + med = median(ratio, na.rm = TRUE), + mode = Mode(ratio), + sd = sd(ratio, na.rm = TRUE), + min = min(ratio, na.rm = TRUE), + q1 = quantile(ratio, probs = 0.25, na.rm = TRUE), + q3 = quantile(ratio, probs = 0.75, na.rm = TRUE), + max = max(ratio, na.rm = TRUE) + ) diff --git a/Summary_Statistics/profile_descriptions.R b/Summary_Statistics/profile_descriptions.R new file mode 100644 index 0000000..48f334d --- /dev/null +++ b/Summary_Statistics/profile_descriptions.R @@ -0,0 +1,18 @@ +library(tidyverse) + +# read data +df <- read_csv("twitter_accounts_of_journals.csv") %>% + select(twitter, account_description) %>% + distinct() + +# 231 (6%) +df %>% + filter(grepl("open access|\\boa\\b", account_description, ignore.case = T)) + +# 595 (15.6%) +df %>% + filter(grepl("peer.review|\\breviewed\\b|refereed", account_description, ignore.case =)) + +# 263 (6.8%) +df %>% + filter(grepl("\\bJIF\\b|Impact.Factor|CiteScore|[0-9](\\.|,)[0-9][0-9]|most.cited|highly.cited", account_description, ignore.case = T)) \ No newline at end of file diff --git a/Summary_Statistics/share_by_discipline.R b/Summary_Statistics/share_by_discipline.R new file mode 100644 index 0000000..569ebcd --- /dev/null +++ b/Summary_Statistics/share_by_discipline.R @@ -0,0 +1,297 @@ +library(tidyverse) + +# read data +df <- read_csv("twitter_accounts_of_journals.csv") + +# function for Modal value +Mode <- function(x) { + ux <- unique(x) + ux[which.max(tabulate(match(x, ux)))] +} + +# create column with Web of Science index +df <- df %>% + select(journal_title, issn, twitter, has_twitter, ahci, ssci, scie, + wos_scie, wos_ahci, wos_ssci) %>% + distinct() %>% + pivot_longer(cols = c("ahci", "ssci", "scie"), + names_to = "wos_index") %>% + filter(value == 1) %>% + select(-value) + +# summary statistics for SCIE +SCIE <- df %>% + filter(wos_index == "scie") %>% + distinct() %>% + separate_rows(wos_scie, sep = "\\|") %>% + mutate(wos_scie = trimws(wos_scie)) + +SCIE %>% + group_by(wos_scie) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = n(), + share = with / total * 100) %>% + filter(total > 9) %>% + filter(!is.na(wos_scie)) %>% + pivot_longer(cols = c(with, without)) %>% + mutate(name = factor(name, levels = c("without", "with")), + share = round(share, 1)) %>% + arrange(desc(share)) %>% + filter(name == "with") %>% + summarise( + avg = mean(share, na.rm = TRUE), + med = median(share, na.rm = TRUE), + mode = Mode(share), + sd = sd(share, na.rm = TRUE), + min = min(share, na.rm = TRUE), + q1 = quantile(share, probs = 0.25, na.rm = TRUE), + q3 = quantile(share, probs = 0.75, na.rm = TRUE), + max = max(share, na.rm = TRUE) + ) + +# summary statistics for SSCI +SSCI <- df %>% + filter(wos_index == "ssci") %>% + distinct() %>% + separate_rows(wos_ssci, sep = "\\|") %>% + mutate(wos_ssci = trimws(wos_ssci)) + +SSCI %>% + group_by(wos_ssci) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = with + without, + share = with / total * 100) %>% + filter(total > 5) %>% + filter(!is.na(wos_ssci)) %>% + pivot_longer(cols = c(with, without)) %>% + mutate(name = factor(name, levels = c("without", "with")), + share = round(share, 1)) %>% + arrange(desc(share)) %>% + filter(name == "with") %>% + summarise( + avg = mean(share, na.rm = TRUE), + med = median(share, na.rm = TRUE), + mode = Mode(share), + sd = sd(share, na.rm = TRUE), + min = min(share, na.rm = TRUE), + q1 = quantile(share, probs = 0.25, na.rm = TRUE), + q3 = quantile(share, probs = 0.75, na.rm = TRUE), + max = max(share, na.rm = TRUE) + ) + +# summary statistics for AHCI +AHCI <- df %>% + filter(wos_index == "ahci") %>% + distinct() %>% + separate_rows(wos_ahci, sep = "\\|") %>% + mutate(wos_ahci = trimws(wos_ahci)) + +AHCI %>% + group_by(wos_ahci) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = with + without, + share = with / total * 100) %>% + filter(total > 5) %>% + filter(!is.na(wos_ahci)) %>% + pivot_longer(cols = c(with, without)) %>% + mutate(name = factor(name, levels = c("without", "with")), + share = round(share, 1)) %>% + arrange(desc(share)) %>% + filter(name == "with") %>% + summarise( + avg = mean(share, na.rm = TRUE), + med = median(share, na.rm = TRUE), + mode = Mode(share), + sd = sd(share, na.rm = TRUE), + min = min(share, na.rm = TRUE), + q1 = quantile(share, probs = 0.25, na.rm = TRUE), + q3 = quantile(share, probs = 0.75, na.rm = TRUE), + max = max(share, na.rm = TRUE) + ) + +# graph --- SSCI & AHCI +pp1 <- df %>% + filter(wos_index == "ssci") %>% + distinct() %>% + separate_rows(wos_ssci, sep = "\\|") %>% + mutate(wos_ssci = trimws(wos_ssci)) %>% + group_by(wos_ssci) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = with + without, + share = with / total * 100) %>% + filter(total > 5) %>% + filter(!is.na(wos_ssci)) %>% + pivot_longer(cols = c(with, without)) %>% + mutate(name = factor(name, levels = c("without", "with")), + share = round(share, 1)) %>% + arrange(desc(share)) %>% + ggplot() + + geom_col(aes(x = value, + y = reorder(wos_ssci, share), + fill = name), + position = "fill") + + geom_text(aes(label = ifelse(name == "with", paste0(share, "%"), ""), x = value, y = reorder(wos_ssci, share)), + size = 2.5, + hjust = -0.1, + position = position_fill(vjust = 1)) + + scale_fill_manual(values = c("grey", "black")) + + scale_x_continuous(labels = scales::percent) + + theme_minimal() + + theme(axis.title = element_blank(), + axis.text.y = element_text(size = 8), + legend.position = "none") + +pp2 <- df %>% + filter(wos_index == "ahci") %>% + distinct() %>% + separate_rows(wos_ahci, sep = "\\|") %>% + mutate(wos_ahci = trimws(wos_ahci)) %>% + group_by(wos_ahci) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = with + without, + share = with / total * 100) %>% + filter(total > 5) %>% + filter(!is.na(wos_ahci)) %>% + pivot_longer(cols = c(with, without)) %>% + mutate(name = factor(name, levels = c("without", "with")), + share = round(share, 1)) %>% + arrange(desc(share)) %>% + ggplot() + + geom_col(aes(x = value, + y = reorder(wos_ahci, share), + fill = name), + position = "fill") + + geom_text(aes(label = ifelse(name == "with", paste0(share, "%"), ""), x = value, y = reorder(wos_ahci, share)), + size = 2.5, + hjust = -0.1, + position = position_fill(vjust = 1)) + + scale_fill_manual(values = c("grey", "black")) + + scale_x_continuous(labels = scales::percent) + + theme_minimal() + + theme(axis.title = element_blank(), + axis.text.y = element_text(size = 8), + legend.position = "none") + +pp <- cowplot::plot_grid(pp1, pp2, labels = c("SSCI", "AHCI")) + +ggsave("Graph\\categories_ahci_ssci.png", + pp, + width = 9, + height = 13, + units = "in", + dpi = 300 +) + +# grpah -- SCIE +scie.prep <- df %>% + filter(wos_index == "scie") %>% + distinct() %>% + separate_rows(wos_scie, sep = "\\|") %>% + mutate(wos_scie = trimws(wos_scie)) %>% + group_by(wos_scie) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = with + without, + share = with / total * 100) %>% + filter(total > 5) %>% + filter(!is.na(wos_scie)) %>% + pivot_longer(cols = c(with, without)) %>% + mutate(name = factor(name, levels = c("without", "with")), + share = round(share, 1)) %>% + arrange(desc(share)) + +scie.df <- scie.prep %>% select(wos_scie, share) %>% arrange(desc(share)) %>% distinct() + + +p1 <- scie.prep %>% + top_n(176, share) %>% + ggplot() + + geom_col(aes(x = value, + y = reorder(wos_scie, share), + fill = name), + position = "fill") + + geom_text(aes(label = ifelse(name == "with", paste0(share, "%"), ""), x = value, y = reorder(wos_scie, share)), + size = 2.5, + hjust = -0.1, + position = position_fill(vjust = 1)) + + scale_fill_manual(values = c("grey", "black")) + + scale_x_continuous(labels = scales::percent) + + theme_minimal() + + #labs(title = "SCIE") + + theme(axis.title = element_blank(), + axis.text.y = element_text(size = 8), + legend.position = "none", + #plot.title.position = "plot", + #plot.title = element_text(size = 14, face = "bold") + ) + +p2 <- scie.prep %>% + top_n(-176, share) %>% + ggplot() + + geom_col(aes(x = value, + y = reorder(wos_scie, share), + fill = name), + position = "fill") + + geom_text(aes(label = ifelse(name == "with", paste0(share, "%"), ""), x = value, y = reorder(wos_scie, share)), + size = 2.5, + hjust = -0.1, + position = position_fill(vjust = 1)) + + scale_fill_manual(values = c("grey", "black")) + + scale_x_continuous(labels = scales::percent) + + theme_minimal() + + theme(axis.title = element_blank(), + axis.text.y = element_text(size = 8), + legend.position = "none") + +scieplot <- cowplot::plot_grid(p1, p2, labels = "SCIE") + +ggsave("Graph\\categories_scie.png", + scieplot, + width = 9, + height = 13, + units = "in", + dpi = 300) + + +# ========== +# summary statistics for all categories +# ========== +AHCI %>% + bind_rows(SCIE) %>% + bind_rows(SSCI) %>% + mutate(wos_scie = paste0("scie_", wos_scie), + wos_ssci = paste0("ssci_", wos_ssci), + wos_ahci = paste0("ahci_", wos_ahci), + ) %>% + pivot_longer(c(wos_scie, wos_ahci, wos_ssci)) %>% + separate_rows(value, sep = "\\|") %>% + mutate(value = trimws(value)) %>% + filter(!grepl("NA", value)) %>% + group_by(value) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = with + without, + share = with / total * 100) %>% + filter(grepl("^(ssci|scie|ahci)", value)) %>% + filter(total > 5) %>% + select("category" = value, with, without, total, share) %>% + pivot_longer(cols = c(with, without)) %>% + mutate(name = factor(name, levels = c("without", "with")), + share = round(share, 1)) %>% + arrange(desc(share)) %>% + filter(name == "with") %>% + summarise( + avg = mean(share, na.rm = TRUE), + med = median(share, na.rm = TRUE), + mode = Mode(share), + sd = sd(share, na.rm = TRUE), + min = min(share, na.rm = TRUE), + q1 = quantile(share, probs = 0.25, na.rm = TRUE), + q3 = quantile(share, probs = 0.75, na.rm = TRUE), + max = max(share, na.rm = TRUE) + ) diff --git a/Summary_Statistics/share_by_index.R b/Summary_Statistics/share_by_index.R new file mode 100644 index 0000000..5c08375 --- /dev/null +++ b/Summary_Statistics/share_by_index.R @@ -0,0 +1,35 @@ +library(tidyverse) + +# read data +df <- read_csv("twitter_accounts_of_journals.csv") + +DISTINCT <- df %>% + select(journal_title, issn, twitter) %>% + distinct() %>% + nrow() + +# create column with Web of Science index +df %>% + pivot_longer(cols = c("ahci", "ssci", "scie"), + names_to = "wos_index") %>% + filter(value == 1) %>% + select(-value, journal_title, issn, has_twitter) %>% + distinct() %>% +# generate summary statistics + group_by(wos_index) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = n(), + share = with / total * 100 + ) + +# summary statistics for all journals +df %>% + select(journal_title, issn, has_twitter) %>% + distinct() %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = n(), + share = with / total * 100 +) + diff --git a/Summary_Statistics/share_by_publisher.R b/Summary_Statistics/share_by_publisher.R new file mode 100644 index 0000000..cec7a87 --- /dev/null +++ b/Summary_Statistics/share_by_publisher.R @@ -0,0 +1,18 @@ +library(tidyverse) + +# read data +df <- read_csv("twitter_accounts_of_journals.csv") + +df %>% + select(publisher_name, journal_title, issn, has_twitter) %>% + distinct() %>% + group_by(publisher_name) %>% + summarise(with = sum(has_twitter), + without = n() - with, + total = with + without, + share = with / total * 100, + + share = round(share, 1)) %>% + select(publisher_name, total, share) %>% + filter(total > 9) %>% + arrange(desc(share)) \ No newline at end of file diff --git a/Summary_Statistics/share_by_year.R b/Summary_Statistics/share_by_year.R new file mode 100644 index 0000000..6619dba --- /dev/null +++ b/Summary_Statistics/share_by_year.R @@ -0,0 +1,52 @@ +library(tidyverse) + +# read data +df <- read_csv("twitter_accounts_of_journals.csv") + +df <- df %>% + mutate(has_twitter = ifelse(is.na(twitter), 0, 1)) %>% + select(journal_title, issn, twitter, account_created_date, has_twitter) %>% + distinct() + +# reduce Twitter account creation date to year +JJ <- df %>% + select(twitter, account_created_date) %>% + distinct() %>% + filter(!is.na(twitter)) %>% + mutate(account_created_date = format(account_created_date , "%Y-%m"), + year = substr(account_created_date , 1, 4), + ) %>% + group_by(year) %>% + summarise(new_accounts = n()) %>% + filter(!is.na(year)) + +JJ$total <- cumsum(JJ$new_accounts) +JJ$missing <- nrow(df) - JJ$total + +JJ$share <- round(JJ$total/nrow(df)*100,1) +JJ$share.rev <- 100-JJ$share + +#df %>% +# mutate(diff = round(share.rev - lag(share.rev), 1)) + +JJ %>% + filter(year < 2022) %>% + ggplot(aes(x = year, y = missing, group = 1)) + + geom_step() + + scale_y_continuous(limits = c(0, NA)) + + theme_classic() + + theme(axis.text.x = element_text(angle = 45, vjust = 0.1)) + + scale_x_discrete(labels = unique(JJ$year)) + + xlab("") + + ylab("Journals without Twitter Accounts") + + geom_hline(aes(yintercept = nrow(df)), linetype = "dotted") + + geom_text(aes(x = year, + label = ifelse(year != "2007", paste0(share.rev,"%"), "")), + size = 2.5, + vjust = 2) + +ggsave("Graph\\step_missing_journals.png", + width = 6, + height = 4.5, + units = "in", + dpi = 300) diff --git a/Summary_Statistics/twitter_api.R b/Summary_Statistics/twitter_api.R new file mode 100644 index 0000000..54ed5bd --- /dev/null +++ b/Summary_Statistics/twitter_api.R @@ -0,0 +1,154 @@ +library(tidyverse) +library(httr) +library(jsonlite) +library(rtweet) + +# read data +JJ <- read_csv("twitter_accounts_of_journals.csv") + +twaccounts <- JJ %>% + select(twitter) %>% + filter(!is.na(twitter)) %>% + distinct() + +twaccounts$twitter <- stringr::str_remove(twaccounts$twitter, "https://twitter.com/") +# ================= +# Twitter API -- your API access data here! +# ================= + +# App name +an <- "" +# API key +ak <- "" +# API secret key +ask <- "" +# Access token +at <- "" +# Access token secret +ats <- "" + +t <- create_token(an, ak, ask, at, ats) + +# ===================== +# Acccess API +# ===================== + +DF <- list() + +for (i in 1:nrow(twaccounts)) { + handle <- as.character(twaccounts[i, 1]) + + printtext <- paste0(i, "/", nrow(twaccounts), ": ", twaccounts[i, 1], " (@", handle, ")") + print(printtext) + + twtimeline <- rtweet::get_timeline(handle, n = 3200, token = t) + + # total nr of tweets + total_nr_tweets <- nrow(twtimeline) + + if (total_nr_tweets == 0) { + + xyz <- rtweet::lookup_users(handle, token = t) + + xyz <- xyz %>% + select(account_created_at, description, followers_count) + + DFJ <- data.frame( + twaccounts[twaccounts$twitter == handle, ], + "year" = "all", + "tweets_total" = 0, + "unique_mentions" = 0, + "unique_rt" = 0, + "unique_rep" = 0, + "uniquenames_mentions" = NA, + "uniquenames_rt" = NA, + "uniquenames_rep" = NA, + "uniquenames" = NA, + "account_created_date" = xyz$account_created_at, + "account_description" = xyz$description, + "account_followers" = xyz$followers_count, + "date" = Sys.Date() + ) + } else { + twtimeline <- twtimeline %>% + mutate(year = substr(created_at, 1, 4)) + + allyears <- twtimeline %>% + select(year) %>% + distinct() %>% + rbind(year = "all") %>% + unlist() %>% + unname() + + DF_J <- list() + + for (ii in 1:length(allyears)) { + if (allyears[ii] != "all") { + twt2 <- twtimeline %>% + filter(year == allyears[ii]) + } else { + twt2 <- twtimeline + } + + allusers <- twt2 %>% + filter(is_retweet == FALSE) %>% + select(mentions_screen_name) %>% + filter(!is.na(mentions_screen_name)) %>% + unlist() %>% + unname() + allusers <- allusers[!allusers == handle] + + rtusers <- twt2[twt2$is_retweet == TRUE, ] %>% + select(retweet_screen_name) %>% + filter(!is.na(retweet_screen_name)) %>% + unlist() %>% + unname() + rtusers <- rtusers[!rtusers == handle] + + repusers <- twt2[!is.na(twt2$reply_to_user_id), ] %>% + select(reply_to_screen_name) %>% + filter(!is.na(reply_to_screen_name)) %>% + unlist() %>% + unname + repusers <- repusers[!repusers == handle] + + uniquenames <- c(rtusers, allusers, repusers) + uniquenames <- paste(uniquenames, collapse = ";") + + uniquenames_mentions <- paste(allusers, collapse = ";") + uniquenames_rt <- paste(rtusers, collapse = ";") + uniquenames_rep <- paste(repusers, collapse = ";") + + DF_J[[ii]] <- data.frame( + twaccounts[twaccounts$twitter == handle, ], + "year" = allyears[ii], + "tweets_total" = nrow(twt2), + "unique_mentions" = length(unique(allusers)), + "unique_rt" = length(unique(rtusers)), + "unique_rep" = length(unique(repusers)), + "uniquenames_mentions" = uniquenames_mentions, + "uniquenames_rt" = uniquenames_rt, + "uniquenames_rep" = uniquenames_rep, + "uniquenames" = uniquenames, + "account_created_date" = substr(twtimeline$account_created_at[1], 1, 10), + "account_description" = twtimeline$description[1], + "account_followers" = twtimeline$followers_count[1], + "date" = Sys.Date() + ) + } + + DFJ <- dplyr::bind_rows(DF_J) + rm(DF_J) + } + + DF[[i]] <- DFJ + + print("----- done.") + + Sys.sleep(1) +} + + +DFF <- do.call(rbind, DF) + +arrow::write_parquet(DFF, "Summary_Statistics\\twitter_data.parquet") diff --git a/Summary_Statistics/twitter_data.parquet b/Summary_Statistics/twitter_data.parquet new file mode 100644 index 0000000..1998999 Binary files /dev/null and b/Summary_Statistics/twitter_data.parquet differ diff --git a/journals-on-twitter.Rproj b/journals-on-twitter.Rproj new file mode 100644 index 0000000..8e3c2eb --- /dev/null +++ b/journals-on-twitter.Rproj @@ -0,0 +1,13 @@ +Version: 1.0 + +RestoreWorkspace: Default +SaveWorkspace: Default +AlwaysSaveHistory: Default + +EnableCodeIndexing: Yes +UseSpacesForTab: Yes +NumSpacesForTab: 2 +Encoding: UTF-8 + +RnwWeave: Sweave +LaTeX: pdfLaTeX diff --git a/twitter_accounts_of_journals.csv b/twitter_accounts_of_journals.csv new file mode 100644 index 0000000..e246bc1 --- /dev/null +++ b/twitter_accounts_of_journals.csv @@ -0,0 +1,14983 @@ +journal_title,issn,e_issn,twitter,ahci,ssci,scie,has_twitter,wos_scie,wos_ssci,wos_ahci,publisher_name,account_created_date +20 et 21-revue d histoire,2649-664X,2649-6100,NA,1,0,0,0,NA,NA,History,PRESSES SCIENCES PO,NA +2d materials,2053-1583,2053-1583,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +3 biotech,2190-572X,2190-5738,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,SPRINGER HEIDELBERG,NA +3d printing and additive manufacturing,2329-7662,2329-7670,3DPrintingJrnl,0,0,1,1,"Engineering, Manufacturing | Materials Science, Multidisciplinary",NA,NA,"MARY ANN LIEBERT, INC",2013-06-28 +4or-a quarterly journal of operations research,1619-4500,1614-2411,NA,0,0,1,0,Operations Research & Management Science,NA,NA,SPRINGER HEIDELBERG,NA +a + u-architecture and urbanism,0389-9160,NA,aupublishing,1,0,0,1,NA,NA,Architecture,A & U PUBL CO LTD,2011-01-17 +aaa-arbeiten aus anglistik und amerikanistik,0171-5410,NA,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,GUNTER NARR VERLAG,NA +aapg bulletin,0149-1423,1558-9153,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,AMER ASSOC PETROLEUM GEOLOGIST,NA +aaps journal,1550-7416,1550-7416,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGER,NA +aaps pharmscitech,1530-9932,1530-9932,pharmscitech,0,0,1,1,Pharmacology & Pharmacy,NA,NA,SPRINGER,2019-01-14 +aatcc journal of research,2330-5517,2330-5517,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,AMER ASSOC TEXTILE CHEMISTS COLORISTS-AATCC,NA +aatcc review,1532-8813,1532-8813,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical | Materials Science, Textiles",NA,NA,AMER ASSOC TEXTILE CHEMISTS COLORISTS-AATCC,NA +ab imperio-studies of new imperial history and nationalism in the post-soviet space,2166-4072,2164-9731,abimperio,1,0,0,1,NA,NA,History,AB IMPERIO INC,2011-05-02 +abacus-a journal of accounting finance and business studies,0001-3072,1467-6281,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +abdominal radiology,2366-004X,2366-0058,Abdominal_Rad,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,2021-06-11 +abhandlungen aus dem mathematischen seminar der universitat hamburg,0025-5858,1865-8784,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +abstracts of papers of the american chemical society,0065-7727,NA,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,NA +academia-revista latinoamericana de administracion,1012-8255,2056-5127,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +academic emergency medicine,1069-6563,1553-2712,AcademicEmerMed,0,0,1,1,Emergency Medicine,NA,NA,WILEY,2014-06-20 +academic medicine,1040-2446,1938-808X,AcadMedJournal,0,0,1,1,"Education, Scientific Disciplines | Health Care Sciences & Services",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2013-03-07 +academic pediatrics,1876-2859,1876-2867,NA,0,0,1,0,Pediatrics,NA,NA,ELSEVIER SCIENCE INC,NA +academic psychiatry,1042-9670,1545-7230,NA,0,1,0,0,NA,Education & Educational Research | Psychiatry,NA,SPRINGER,NA +academic radiology,1076-6332,1878-4046,AcadRadiol,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,2020-08-16 +academy of management annals,1941-6520,1941-6067,NA,0,1,0,0,NA,Business | Management,NA,ACAD MANAGEMENT,NA +academy of management discoveries,2168-1007,2168-1007,NA,0,1,0,0,NA,Management,NA,ACAD MANAGEMENT,NA +academy of management journal,0001-4273,1948-0989,NA,0,1,0,0,NA,Business | Management,NA,ACAD MANAGEMENT,NA +academy of management learning & education,1537-260X,1944-9585,NA,0,1,0,0,NA,Education & Educational Research | Management,NA,ACAD MANAGEMENT,NA +academy of management perspectives,1558-9080,1943-4529,NA,0,1,0,0,NA,Business | Management,NA,ACAD MANAGEMENT,NA +academy of management review,0363-7425,1930-3807,NA,0,1,0,0,NA,Business | Management,NA,ACAD MANAGEMENT,NA +acadiensis,0044-5851,1712-7432,Acadiensis,1,0,0,1,NA,NA,History,UNIV NEW BRUNSWICK,2011-09-23 +acarologia,0044-586X,2107-7207,AcarologiaHome,0,0,1,1,Entomology,NA,NA,ACAROLOGIA-UNIVERSITE PAUL VALERY,2017-01-26 +accident analysis and prevention,0001-4575,1879-2057,NA,0,1,0,0,NA,"Ergonomics | Public, Environmental & Occupational Health | Social Sciences, Interdisciplinary | Transportation",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +accountability in research-policies and quality assurance,0898-9621,1545-5815,NA,0,0,1,0,Medical Ethics,NA,NA,TAYLOR & FRANCIS INC,NA +accounting and business research,0001-4788,2159-4260,AccBusRes,0,1,0,1,NA,"Business, Finance",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-02-10 +accounting and finance,0810-5391,1467-629X,AF_AFAANZ,0,1,0,1,NA,"Business, Finance",NA,WILEY,2015-07-08 +accounting auditing & accountability journal,0951-3574,1758-4205,AAAJEmerald,0,1,0,1,NA,"Business, Finance",NA,EMERALD GROUP PUBLISHING LTD,2020-08-25 +accounting forum,0155-9982,1467-6303,TandF_AccForum,0,1,0,1,NA,"Business, Finance",NA,TAYLOR & FRANCIS LTD,2018-05-04 +accounting horizons,0888-7993,1558-7975,NA,0,1,0,0,NA,"Business, Finance",NA,AMER ACCOUNTING ASSOC,NA +accounting organizations and society,0361-3682,1873-6289,NA,0,1,0,0,NA,"Business, Finance",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +accounting review,0001-4826,1558-7967,NA,0,1,0,0,NA,"Business, Finance",NA,AMER ACCOUNTING ASSOC,NA +accounts of chemical research,0001-4842,1520-4898,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,NA +accreditation and quality assurance,0949-1775,1432-0517,NA,0,0,1,0,"Chemistry, Analytical | Instruments & Instrumentation",NA,NA,SPRINGER,NA +aci materials journal,0889-325X,1944-737X,NA,0,0,1,0,"Construction & Building Technology | Materials Science, Multidisciplinary",NA,NA,AMER CONCRETE INST,NA +aci structural journal,0889-3241,1944-7361,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,AMER CONCRETE INST,NA +acm computing surveys,0360-0300,1557-7341,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm journal on computing and cultural heritage,1556-4673,1556-4711,NA,1,0,1,0,"Computer Science, Interdisciplinary Applications",NA,"Humanities, Multidisciplinary",ASSOC COMPUTING MACHINERY,NA +acm journal on computing and cultural heritage,1556-4673,1556-4711,NA,1,0,1,0,"Computer Science, Interdisciplinary Applications",NA,"Humanities, Multidisciplinary",ASSOC COMPUTING MACHINERY,NA +acm journal on emerging technologies in computing systems,1550-4832,1550-4840,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic | Nanoscience & Nanotechnology",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm sigcomm computer communication review,0146-4833,1943-5819,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on algorithms,1549-6325,1549-6333,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on applied perception,1544-3558,1544-3965,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on architecture and code optimization,1544-3566,1544-3973,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on asian and low-resource language information processing,2375-4699,2375-4702,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on autonomous and adaptive systems,1556-4665,1556-4703,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on computational logic,1529-3785,1557-945X,NA,0,0,1,0,"Computer Science, Theory & Methods | Logic",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on computer-human interaction,1073-0516,1557-7325,acmtochi,0,0,1,1,"Computer Science, Cybernetics | Computer Science, Information Systems",NA,NA,ASSOC COMPUTING MACHINERY,2009-09-15 +acm transactions on computer systems,0734-2071,1557-7333,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on computing education,1946-6226,1946-6226,NA,0,0,1,0,"Education, Scientific Disciplines",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on database systems,0362-5915,1557-4644,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on design automation of electronic systems,1084-4309,1557-7309,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on embedded computing systems,1539-9087,1558-3465,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on graphics,0730-0301,1557-7368,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on information systems,1046-8188,1558-2868,acmtois,0,0,1,1,"Computer Science, Information Systems",NA,NA,ASSOC COMPUTING MACHINERY,2011-09-29 +acm transactions on intelligent systems and technology,2157-6904,2157-6912,ACMTIST,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,ASSOC COMPUTING MACHINERY,2011-08-02 +acm transactions on interactive intelligent systems,2160-6455,2160-6463,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on internet technology,1533-5399,1557-6051,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on knowledge discovery from data,1556-4681,1556-472X,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on mathematical software,0098-3500,1557-7295,NA,0,0,1,0,"Computer Science, Software Engineering | Mathematics, Applied",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on modeling and computer simulation,1049-3301,1558-1195,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Mathematics, Applied",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on multimedia computing communications and applications,1551-6857,1551-6865,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on privacy and security,2471-2566,2471-2574,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on programming languages and systems,0164-0925,1558-4593,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on reconfigurable technology and systems,1936-7406,1936-7414,ACM_TRETS,0,0,1,1,"Computer Science, Hardware & Architecture",NA,NA,ASSOC COMPUTING MACHINERY,2020-07-08 +acm transactions on sensor networks,1550-4859,1550-4867,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on software engineering and methodology,1049-331X,1557-7392,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on storage,1553-3077,1553-3093,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,NA +acm transactions on the web,1559-1131,1559-114X,TWebACM,0,0,1,1,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,2021-02-18 +acoustical physics,1063-7710,1562-6865,NA,0,0,1,0,Acoustics,NA,NA,PLEIADES PUBLISHING INC,NA +acoustics australia,0814-6039,1839-2571,NA,0,0,1,0,Acoustics,NA,NA,SPRINGER SINGAPORE PTE LTD,NA +across languages and cultures,1585-1923,1588-2519,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,AKADEMIAI KIADO ZRT,NA +across languages and cultures,1585-1923,1588-2519,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,AKADEMIAI KIADO ZRT,NA +acs applied electronic materials,2637-6113,2637-6113,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,NA +acs applied energy materials,2574-0962,2574-0962,ACS_AEM,0,0,1,1,"Chemistry, Physical | Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2017-09-27 +acs applied materials & interfaces,1944-8244,1944-8252,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,NA +acs applied nano materials,2574-0970,2574-0970,ACS_ANM,0,0,1,1,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2017-09-27 +acs applied polymer materials,2637-6105,2637-6105,NA,0,0,1,0,"Materials Science, Multidisciplinary | Polymer Science",NA,NA,AMER CHEMICAL SOC,NA +acs biomaterials science & engineering,2373-9878,2373-9878,ACSBiomaterials,0,0,1,1,"Materials Science, Biomaterials",NA,NA,AMER CHEMICAL SOC,2015-01-07 +acs catalysis,2155-5435,2155-5435,ACSCatalysis,0,0,1,1,"Chemistry, Physical",NA,NA,AMER CHEMICAL SOC,2011-05-17 +acs central science,2374-7943,2374-7951,ACSCentSci,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2013-11-07 +acs chemical biology,1554-8929,1554-8937,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,AMER CHEMICAL SOC,NA +acs chemical neuroscience,1948-7193,1948-7193,ACSChemNeurosci,0,0,1,1,"Biochemistry & Molecular Biology | Chemistry, Medicinal | Neurosciences",NA,NA,AMER CHEMICAL SOC,2009-08-07 +acs combinatorial science,2156-8952,2156-8944,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Medicinal | Chemistry, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,NA +acs earth and space chemistry,2472-3452,2472-3452,ACSEarthSpace,0,0,1,1,"Chemistry, Multidisciplinary | Geochemistry & Geophysics",NA,NA,AMER CHEMICAL SOC,2016-10-14 +acs energy letters,2380-8195,2380-8195,NA,0,0,1,0,"Chemistry, Physical | Electrochemistry | Energy & Fuels | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,NA +acs infectious diseases,2373-8227,2373-8227,ACS_Infectious,0,0,1,1,"Chemistry, Medicinal | Infectious Diseases",NA,NA,AMER CHEMICAL SOC,2014-12-15 +acs macro letters,2161-1653,2161-1653,ACSMacroLett,0,0,1,1,Polymer Science,NA,NA,AMER CHEMICAL SOC,2013-02-08 +acs materials letters,2639-4979,2639-4979,ACSMatLett,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2019-02-15 +acs medicinal chemistry letters,1948-5875,1948-5875,NA,0,0,1,0,"Chemistry, Medicinal",NA,NA,AMER CHEMICAL SOC,NA +acs nano,1936-0851,1936-086X,acsnano,0,0,1,1,"Chemistry, Multidisciplinary | Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2009-03-05 +acs omega,2470-1343,2470-1343,ACS_Omega,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2016-04-27 +acs photonics,2330-4022,2330-4022,ACSPhotonics,0,0,1,1,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Optics | Physics, Applied | Physics, Condensed Matter",NA,NA,AMER CHEMICAL SOC,2014-03-17 +acs sensors,2379-3694,2379-3694,ACS_Sensors,0,0,1,1,"Chemistry, Multidisciplinary | Chemistry, Analytical | Nanoscience & Nanotechnology",NA,NA,AMER CHEMICAL SOC,2016-01-07 +acs sustainable chemistry & engineering,2168-0485,2168-0485,ACSSustainable,0,0,1,1,"Chemistry, Multidisciplinary | Green & Sustainable Science & Technology | Engineering, Chemical",NA,NA,AMER CHEMICAL SOC,2015-11-30 +acs synthetic biology,2161-5063,2161-5063,ACSSynBio,0,0,1,1,Biochemical Research Methods,NA,NA,AMER CHEMICAL SOC,2012-06-20 +acsms health & fitness journal,1091-5397,1536-593X,NA,0,0,1,0,Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +acta acustica,1022-4793,2681-4617,ActaAcustica,0,0,1,1,Acoustics,NA,NA,EDP SCIENCES S A,2021-04-16 +acta adriatica,0001-5113,1846-0453,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,INST OCEANOGRAFIJU I RIBARSTVO,NA +acta agriculturae scandinavica section a-animal science,0906-4702,1651-1972,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,TAYLOR & FRANCIS AS,NA +acta agriculturae scandinavica section b-soil and plant science,0906-4710,1651-1913,NA,0,0,1,0,Agronomy | Soil Science,NA,NA,TAYLOR & FRANCIS AS,NA +acta alimentaria,0139-3006,1588-2535,NA,0,0,1,0,Food Science & Technology | Nutrition & Dietetics,NA,NA,AKADEMIAI KIADO ZRT,NA +acta amazonica,0044-5967,1809-4392,NA,0,0,1,0,Plant Sciences | Ecology | Zoology,NA,NA,INST NACIONAL PESQUISAS AMAZONIA,NA +acta anaesthesiologica scandinavica,0001-5172,1399-6576,NA,0,0,1,0,Anesthesiology,NA,NA,WILEY,NA +acta analytica-international periodical for philosophy in the analytical tradition,0353-5150,1874-6349,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +acta applicandae mathematicae,0167-8019,1572-9036,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER,NA +acta archaeologica,0065-101X,1600-0390,NA,1,0,0,0,NA,NA,Archaeology,WILEY,NA +acta arithmetica,0065-1036,1730-6264,NA,0,0,1,0,Mathematics,NA,NA,POLISH ACAD SCIENCES INST MATHEMATICS-IMPAN,NA +acta astronautica,0094-5765,1879-2030,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +acta astronomica,0001-5237,0001-5237,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,COPERNICUS FOUNDATION POLISH ASTRONOMY,NA +acta biochimica et biophysica sinica,1672-9145,1745-7270,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,OXFORD UNIV PRESS,NA +acta biochimica polonica,0001-527X,1734-154X,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,ACTA BIOCHIMICA POLONICA,NA +acta bioethica,1726-569X,1726-569X,NA,0,1,1,0,Medical Ethics,"Ethics | Social Sciences, Biomedical",NA,"UNIV CHILE, CENTRO INTERDISCIPLINARIO ESTUDIOS BIOETICA",NA +acta bioethica,1726-569X,1726-569X,NA,0,1,1,0,Medical Ethics,"Ethics | Social Sciences, Biomedical",NA,"UNIV CHILE, CENTRO INTERDISCIPLINARIO ESTUDIOS BIOETICA",NA +acta biologica colombiana,1900-1649,1900-1649,RevistaABC,0,0,1,1,Plant Sciences | Zoology,NA,NA,"UNIV NAC COLOMBIA, FAC CIENCIAS, DEPT BIOL",2013-02-18 +acta biologica cracoviensia series botanica,0001-5296,1898-0295,NA,0,0,1,0,Plant Sciences,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES, PAS BRANCH CRACOW",NA +acta biomaterialia,1742-7061,1878-7568,ActaBio,0,0,1,1,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,ELSEVIER SCI LTD,2013-12-04 +acta bioquimica clinica latinoamericana,0325-2957,1851-6114,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,FEDERACION BIOQUIMICA PROVINCIA BUENOS AIRES,NA +acta biotheoretica,0001-5342,1572-8358,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,SPRINGER,NA +acta borealia,0800-3831,1503-111X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +acta botanica brasilica,0102-3306,1677-941X,abbrasilica,0,0,1,1,Plant Sciences,NA,NA,SOC BOTANICA BRASIL,2017-12-14 +acta botanica croatica,0365-0588,1847-8476,ActaBotCro,0,0,1,1,Plant Sciences,NA,NA,"UNIV ZAGREB, FAC SCIENCE, DIV BIOLOGY",2016-01-05 +acta botanica mexicana,0187-7151,2448-7589,ActaBotMex,0,0,1,1,Plant Sciences,NA,NA,INST ECOLOGIA AC,2012-09-24 +acta cardiologica,0001-5385,1784-973X,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,TAYLOR & FRANCIS LTD,NA +acta cardiologica sinica,1011-6842,NA,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,TAIWAN SOC CARDIOLOGY,NA +acta carsologica,0583-6050,1580-2612,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,KARST RESEARCH INST ZRC SAZU,NA +acta chimica sinica,0567-7351,NA,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SCIENCE PRESS,NA +acta chimica slovenica,1318-0207,1580-3155,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SLOVENSKO KEMIJSKO DRUSTVO,NA +acta chiropterologica,1508-1109,1733-5329,ActaChiroptero1,0,0,1,1,Zoology,NA,NA,MUSEUM & INST ZOOLOGY PAS-POLISH ACAD SCIENCES,NA +acta chirurgiae orthopaedicae et traumatologiae cechoslovaca,0001-5415,NA,NA,0,0,1,0,Orthopedics,NA,NA,GALEN SRO,NA +acta chirurgica belgica,0001-5458,0001-5458,NA,0,0,1,0,Surgery,NA,NA,TAYLOR & FRANCIS LTD,NA +acta chromatographica,1233-2356,2083-5736,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,AKADEMIAI KIADO ZRT,NA +acta cirurgica brasileira,0102-8650,1678-2674,ActaCirurgicaBR,0,0,1,1,Surgery,NA,NA,ACTA CIRURGICA BRASILEIRA,2022-02-18 +acta classica,0065-1141,2227-538X,NA,1,0,0,0,NA,NA,Classics,"UNIV FREE STATE, DEPT ENG CLASSICAL LANG",NA +acta clinica belgica,1784-3286,2295-3337,ActaClinica,0,0,1,1,"Medicine, General & Internal",NA,NA,TAYLOR & FRANCIS LTD,2015-01-06 +acta clinica croatica,0353-9466,1333-9451,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SESTRE MILOSRDNICE UNIV HOSPITAL,NA +acta crystallographica a-foundation and advances,2053-2733,2053-2733,ActaCrystA,0,0,1,1,"Chemistry, Multidisciplinary | Crystallography",NA,NA,INT UNION CRYSTALLOGRAPHY,2012-05-22 +acta crystallographica section b-structural science crystal engineering and materials,2052-5206,2052-5206,ActaCrystB,0,0,1,1,"Chemistry, Multidisciplinary | Crystallography",NA,NA,INT UNION CRYSTALLOGRAPHY,2012-05-22 +acta crystallographica section c-structural chemistry,2053-2296,2053-2296,ActaCrystC,0,0,1,1,"Chemistry, Multidisciplinary | Crystallography",NA,NA,INT UNION CRYSTALLOGRAPHY,2012-05-22 +acta crystallographica section d-structural biology,2059-7983,2059-7983,ActaCrystD,0,0,1,1,Biochemical Research Methods | Biochemistry & Molecular Biology | Biophysics | Crystallography,NA,NA,INT UNION CRYSTALLOGRAPHY,2012-05-22 +acta crystallographica section f-structural biology communications,2053-230X,2053-230X,ActaCrystF,0,0,1,1,Biochemical Research Methods | Biochemistry & Molecular Biology | Biophysics | Crystallography,NA,NA,INT UNION CRYSTALLOGRAPHY,2012-05-22 +acta cytologica,0001-5547,1938-2650,NA,0,0,1,0,Pathology,NA,NA,KARGER,NA +acta dermato-venereologica,0001-5555,1651-2057,NA,0,0,1,0,Dermatology,NA,NA,ACTA DERMATO-VENEREOLOGICA,NA +acta dermatovenerologica croatica,1330-027X,1847-6538,NA,0,0,1,0,Dermatology,NA,NA,CROATION DERMATOVENEROLOGICAL SOC,NA +acta diabetologica,0940-5429,1432-5233,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +acta endocrinologica-bucharest,1841-0987,1843-066X,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,EDITURA ACAD ROMANE,NA +acta entomologica musei nationalis pragae,0374-1036,1804-6487,ActaEntomol,0,0,1,1,Entomology,NA,NA,"NARODNI MUZEUM - PRIRODOVEDECKE MUZEUM",2018-03-20 +acta ethologica,0873-9749,1437-9546,NA,0,0,1,0,Behavioral Sciences | Zoology,NA,NA,SPRINGER HEIDELBERG,NA +acta gastro-enterologica belgica,1784-3227,NA,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,UNIV CATHOLIQUE LOUVAIN-UCL,NA +acta geodaetica et geophysica,2213-5812,2213-5820,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SPRINGER,NA +acta geodynamica et geomaterialia,1214-9705,NA,NA,0,0,1,0,Geochemistry & Geophysics | Mining & Mineral Processing,NA,NA,ACAD SCI CZECH REPUBLIC INST ROCK STRUCTURE & MECHANICS,NA +acta geographica slovenica-geografski zbornik,1581-6613,1854-5106,NA,0,0,1,0,"Geography, Physical",NA,NA,GEOGRAFSKI INST ANTONA MELIKA ZRC SAZU,NA +acta geologica polonica,0001-5709,2300-1887,NA,0,0,1,0,Geology,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES, UNIV WARSAW, GEOLOGY DEPT",NA +acta geologica sinica-english edition,1000-9515,1755-6724,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,WILEY,NA +acta geophysica,1895-6572,1895-7455,AGeophysica,0,0,1,1,Geochemistry & Geophysics,NA,NA,SPRINGER INT PUBL AG,2021-07-21 +acta geotechnica,1861-1125,1861-1133,NA,0,0,1,0,"Engineering, Geological",NA,NA,SPRINGER HEIDELBERG,NA +acta geotechnica slovenica,1854-0171,NA,NA,0,0,1,0,"Engineering, Geological",NA,NA,UNIV MARIBOR,NA +acta haematologica,0001-5792,1421-9662,NA,0,0,1,0,Hematology,NA,NA,KARGER,NA +acta herpetologica,1827-9635,1827-9643,NA,0,0,1,0,Zoology,NA,NA,FIRENZE UNIV PRESS,NA +acta histochemica,0065-1281,1618-0372,NA,0,0,1,0,Cell Biology,NA,NA,ELSEVIER GMBH,NA +acta histochemica et cytochemica,0044-5991,1347-5800,NA,0,0,1,0,Cell Biology,NA,NA,JAPAN SOC HISTOCHEMISTRY & CYTOCHEMISTRY,NA +acta historica tallinnensia,1406-2925,1736-7476,NA,1,0,0,0,NA,NA,History,ESTONIAN ACAD PUBLISHERS,NA +acta histriae,1318-0185,2591-1767,NA,1,1,0,0,NA,History,History,HISTORICAL SOC SOUTHERN PRIMORSKA KOPER-HSSP,NA +acta histriae,1318-0185,2591-1767,NA,1,1,0,0,NA,History,History,HISTORICAL SOC SOUTHERN PRIMORSKA KOPER-HSSP,NA +acta ichthyologica et piscatoria,0137-1592,1734-1515,NA,0,0,1,0,Fisheries | Zoology,NA,NA,PENSOFT PUBLISHERS,NA +acta informatica,0001-5903,1432-0525,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,SPRINGER,NA +acta koreana,1520-7412,NA,NA,1,0,0,0,NA,NA,Asian Studies,ACADEMIA KOREANA KEIMYUNG UNIV,NA +acta linguistica academica,2559-8201,2560-1016,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,AKADEMIAI KIADO ZRT,NA +acta linguistica academica,2559-8201,2560-1016,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,AKADEMIAI KIADO ZRT,NA +acta literaria,0717-6848,0717-6848,NA,1,0,0,0,NA,NA,"Literature, Romance","UNIV CONCEPCION, FAC HUMANIDADES ARTE",NA +acta materialia,1359-6454,1873-2453,Acta_Materialia,0,0,1,1,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2016-02-14 +acta mathematica,0001-5962,1871-2509,NA,0,0,1,0,Mathematics,NA,NA,"INT PRESS BOSTON, INC",NA +acta mathematica hungarica,0236-5294,1588-2632,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +acta mathematica scientia,0252-9602,1572-9087,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +acta mathematica sinica-english series,1439-8516,1439-7617,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER HEIDELBERG,NA +acta mathematicae applicatae sinica-english series,0168-9673,1618-3932,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +acta mechanica,0001-5970,1619-6937,NA,0,0,1,0,Mechanics,NA,NA,SPRINGER WIEN,NA +acta mechanica sinica,0567-7718,1614-3116,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,SPRINGER HEIDELBERG,NA +acta mechanica solida sinica,0894-9166,1860-2134,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics",NA,NA,SPRINGER,NA +acta medica mediterranea,0393-6384,2283-9720,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,CARBONE EDITORE,NA +acta medica okayama,0386-300X,0386-300X,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,OKAYAMA UNIV MED SCHOOL,NA +acta medica portuguesa,1646-0758,1646-0758,ActaMedPort,0,0,1,1,"Medicine, General & Internal",NA,NA,ORDEM MEDICOS,2012-08-31 +acta metallurgica sinica,0412-1961,NA,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SCIENCE PRESS,NA +acta metallurgica sinica-english letters,1006-7191,2194-1289,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,"CHINESE ACAD SCIENCES, INST METAL RESEARCH",NA +acta microbiologica et immunologica hungarica,1217-8950,1588-2640,NA,0,0,1,0,Immunology | Microbiology,NA,NA,AKADEMIAI KIADO ZRT,NA +acta montanistica slovaca,1335-1788,1335-1788,NA,0,0,1,0,"Geosciences, Multidisciplinary | Mining & Mineral Processing",NA,NA,BERG FAC TECHNICAL UNIV KOSICE,NA +acta musicologica,0001-6241,NA,NA,1,0,0,0,NA,NA,Music,INT MUSICOLOGICAL SOC,NA +acta naturae,2075-8251,2075-8251,NA,0,0,1,0,Cell Biology,NA,NA,RUSSIAN FEDERATION AGENCY SCIENCE & INNOVATION,NA +acta neurobiologiae experimentalis,0065-1400,1689-0035,NA,0,0,1,0,Neurosciences,NA,NA,NENCKI INST EXPERIMENTAL BIOLOGY,NA +acta neurochirurgica,0001-6268,0942-0940,ActaNeuro,0,0,1,1,Clinical Neurology | Surgery,NA,NA,SPRINGER WIEN,2019-04-10 +acta neurologica belgica,0300-9009,2240-2993,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,SPRINGER HEIDELBERG,NA +acta neurologica scandinavica,0001-6314,1600-0404,NA,0,0,1,0,Clinical Neurology,NA,NA,WILEY,NA +acta neuropathologica,0001-6322,1432-0533,NA,0,0,1,0,Clinical Neurology | Neurosciences | Pathology,NA,NA,SPRINGER,NA +acta neuropathologica communications,2051-5960,2051-5960,NA,0,0,1,0,Neurosciences,NA,NA,BMC,NA +acta neuropsychiatrica,1601-5215,1601-5215,scnpjournal,0,0,1,1,Neurosciences | Psychiatry,NA,NA,CAMBRIDGE UNIV PRESS,2015-08-26 +acta numerica,0962-4929,1474-0508,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +acta obstetricia et gynecologica scandinavica,0001-6349,1600-0412,AOGS_tweets,0,0,1,1,Obstetrics & Gynecology,NA,NA,WILEY,2014-10-07 +acta oceanologica sinica,0253-505X,1869-1099,NA,0,0,1,0,Oceanography,NA,NA,SPRINGER,NA +acta odontologica scandinavica,0001-6357,1502-3850,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,TAYLOR & FRANCIS LTD,NA +acta oecologica-international journal of ecology,1146-609X,1873-6238,NA,0,0,1,0,Ecology,NA,NA,ELSEVIER,NA +acta oeconomica,0001-6373,1588-2659,NA,0,1,0,0,NA,Economics,NA,AKADEMIAI KIADO ZRT,NA +acta of bioengineering and biomechanics,1509-409X,1509-409X,NA,0,0,1,0,"Biophysics | Engineering, Biomedical",NA,NA,"WROCLAW UNIV TECHNOLOGY, FAC COMPUTER SCIENCE & MANAGEMENT",NA +acta oncologica,0284-186X,1651-226X,actaoncol,0,0,1,1,Oncology,NA,NA,TAYLOR & FRANCIS LTD,2020-06-16 +acta ophthalmologica,1755-375X,1755-3768,ActaOphthalmol,0,0,1,1,Ophthalmology,NA,NA,WILEY,NA +acta orientalia academiae scientiarum hungaricae,1588-2667,0001-6446,NA,1,0,0,0,NA,NA,History | Asian Studies,AKADEMIAI KIADO ZRT,NA +acta ornithologica,0001-6454,1734-8471,actaorn,0,0,1,1,Ornithology,NA,NA,MUSEUM & INST ZOOLOGY,2019-11-14 +acta orthopaedica,1745-3674,1745-3682,ActaOrt,0,0,1,1,Orthopedics,NA,NA,TAYLOR & FRANCIS LTD,2017-12-05 +acta orthopaedica belgica,0001-6462,0001-6462,NA,0,0,1,0,Orthopedics,NA,NA,ACTA MEDICA BELGICA,NA +acta orthopaedica et traumatologica turcica,1017-995X,1017-995X,NA,0,0,1,0,Orthopedics,NA,NA,TURKISH ASSOC ORTHOPAEDICS TRAUMATOLOGY,NA +acta ortopedica brasileira,1413-7852,1809-4406,NA,0,0,1,0,Orthopedics,NA,NA,ATHA COMUNICACAO & EDITORA,NA +acta oto-laryngologica,0001-6489,1651-2251,NA,0,0,1,0,Otorhinolaryngology,NA,NA,TAYLOR & FRANCIS LTD,NA +acta otorhinolaryngologica italica,0392-100X,1827-675X,actaitalica,0,0,1,1,Otorhinolaryngology,NA,NA,PACINI EDITORE,2018-01-27 +acta paediatrica,0803-5253,1651-2227,ActaPaediatrica,0,0,1,1,Pediatrics,NA,NA,WILEY,2015-03-20 +acta palaeontologica polonica,0567-7920,1732-2421,NA,0,0,1,0,Paleontology,NA,NA,INST PALEOBIOLOGII PAN,NA +acta parasitologica,1230-2821,1896-1851,NA,0,0,1,0,Parasitology | Veterinary Sciences | Zoology,NA,NA,SPRINGER INT PUBL AG,NA +acta paulista de enfermagem,0103-2100,1982-0194,ActaPaulEnferm,0,1,1,1,Nursing,Nursing,NA,"UNIV FED SAO PAULO, DEPT ENFERMAGEN",2012-11-09 +acta paulista de enfermagem,0103-2100,1982-0194,ActaPaulEnferm,0,1,1,1,Nursing,Nursing,NA,"UNIV FED SAO PAULO, DEPT ENFERMAGEN",2012-11-09 +acta petrologica sinica,1000-0569,2095-8927,NA,0,0,1,0,Geology,NA,NA,SCIENCE PRESS,NA +acta pharmaceutica,1330-0075,1846-9558,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SCIENDO,NA +acta pharmaceutica sinica b,2211-3835,2211-3843,ActaPharmSinB,0,0,1,1,Pharmacology & Pharmacy,NA,NA,"INST MATERIA MEDICA, CHINESE ACAD MEDICAL SCIENCES",2020-06-02 +acta pharmacologica sinica,1671-4083,1745-7254,NA,0,0,1,0,"Chemistry, Multidisciplinary | Pharmacology & Pharmacy",NA,NA,"NATURE PUBL GROUP",NA +acta philosophica,1121-2179,1825-6562,NA,1,0,0,0,NA,NA,Philosophy,FABRIZIO SERRA EDITORE,NA +acta physica polonica a,0587-4246,1898-794X,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,POLISH ACAD SCIENCES INST PHYSICS,NA +acta physica polonica b,0587-4254,1509-5770,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,JAGIELLONIAN UNIV PRESS,NA +acta physica sinica,1000-3290,NA,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,CHINESE PHYSICAL SOC,NA +acta physica slovaca,0323-0465,1336-040X,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SLOVAK ACAD SCIENCES INST PHYSICS,NA +acta physico-chimica sinica,1000-6818,NA,NA,0,0,1,0,"Chemistry, Physical",NA,NA,PEKING UNIV PRESS,NA +acta physiologiae plantarum,0137-5881,1861-1664,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER HEIDELBERG,NA +acta physiologica,1748-1708,1748-1716,ActaPhysiol,0,0,1,1,Physiology,NA,NA,WILEY,2015-08-14 +acta phytotaxonomica et geobotanica,1346-7565,2189-7042,NA,0,0,1,0,Plant Sciences,NA,NA,"JAPANESE SOC PLANT SYSTEMATICS, UNIV TOKYO, GRADUATE SCH",NA +acta politica,0001-6810,1741-1416,ActaPolitica,0,1,0,1,NA,Political Science,NA,PALGRAVE MACMILLAN LTD,2021-08-25 +acta poloniae historica,0001-6829,0001-6829,NA,1,0,0,0,NA,NA,History,INST HISTORY- PAN,NA +acta poloniae pharmaceutica,0001-6837,2353-5288,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,POLSKIE TOWARZYSTWO FARMACEUTYCZNE,NA +acta polymerica sinica,1000-3304,1000-3304,NA,0,0,1,0,Polymer Science,NA,NA,SCIENCE PRESS,NA +acta polytechnica hungarica,1785-8860,1785-8860,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,BUDAPEST TECH,NA +acta protozoologica,0065-1583,1689-0027,NA,0,0,1,0,Microbiology,NA,NA,"JAGIELLONIAN UNIV, INST ENVIRONMENTAL SCIENCES",NA +acta psychiatrica scandinavica,0001-690X,1600-0447,ActaPsychScand,0,1,1,1,Psychiatry,Psychiatry,NA,WILEY,2017-12-18 +acta psychiatrica scandinavica,0001-690X,1600-0447,ActaPsychScand,0,1,1,1,Psychiatry,Psychiatry,NA,WILEY,2017-12-18 +acta psychologica,0001-6918,1873-6297,NA,0,1,0,0,NA,"Psychology, Experimental",NA,ELSEVIER,NA +acta radiologica,0284-1851,1600-0455,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SAGE PUBLICATIONS LTD,NA +acta reumatologica portuguesa,0303-464X,0303-464X,NA,0,0,1,0,Rheumatology,NA,NA,PUBLISAUDE-EDICOES MEDICAS LDA,NA +acta scientiae veterinariae,1678-0345,1679-9216,NA,0,0,1,0,Veterinary Sciences,NA,NA,UNIV FED RIO GRANDE DO SUL,NA +acta scientiarum-agronomy,1807-8621,1807-8621,NA,0,0,1,0,Agronomy,NA,NA,"UNIV ESTADUAL MARINGA, PRO-REITORIA PESQUISA POS-GRADUACAO",NA +acta scientiarum-technology,1806-2563,1807-8664,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,"UNIV ESTADUAL MARINGA, PRO-REITORIA PESQUISA POS-GRADUACAO",NA +acta scientiarum polonorum-hortorum cultus,1644-0692,2545-1405,NA,0,0,1,0,Horticulture,NA,NA,UNIV LIFE SCIENCES LUBLIN,NA +acta societatis botanicorum poloniae,0001-6977,2083-9480,actasocbotpol,0,0,1,1,Plant Sciences,NA,NA,POLSKIE TOWARZYSTWO BOTANICZNE,2016-06-24 +acta sociologica,0001-6993,1502-3869,ActaSocJournal,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2015-02-06 +acta theologica,1015-8758,2309-9089,NA,1,0,0,0,NA,NA,Religion,"UNIV FREE STATE, FAC THEOLOGY",NA +acta tropica,0001-706X,1873-6254,NA,0,0,1,0,Parasitology | Tropical Medicine,NA,NA,ELSEVIER,NA +acta veterinaria-beograd,0567-8315,1820-7448,NA,0,0,1,0,Veterinary Sciences,NA,NA,SCIENDO,NA +acta veterinaria brno,0001-7213,1801-7576,NA,0,0,1,0,Veterinary Sciences,NA,NA,VETERINARNI A FARMACEUTICKA UNIVERZITA BRNO,NA +acta veterinaria hungarica,0236-6290,1588-2705,NA,0,0,1,0,Veterinary Sciences,NA,NA,AKADEMIAI KIADO ZRT,NA +acta veterinaria scandinavica,0044-605X,1751-0147,NA,0,0,1,0,Veterinary Sciences,NA,NA,BMC,NA +acta virologica,0001-723X,1336-2305,NA,0,0,1,0,Virology,NA,NA,AEPRESS SRO,NA +acta zoologica,0001-7272,1463-6395,NA,0,0,1,0,Anatomy & Morphology | Zoology,NA,NA,WILEY,NA +acta zoologica academiae scientiarum hungaricae,1217-8837,2064-2474,NA,0,0,1,0,Zoology,NA,NA,HUNGARIAN NATURAL HISTORY MUSEUM,NA +acta zoologica bulgarica,0324-0770,NA,NA,0,0,1,0,Zoology,NA,NA,"INST ZOOLOGY, BAS",NA +actas espanolas de psiquiatria,1139-9287,1578-2735,NA,0,0,1,0,Neurosciences | Psychiatry,NA,NA,JUAN JOSE LOPEZ-IBOR FOUNDATION,NA +actas urologicas espanolas,0210-4806,1699-7980,actasurologicas,0,0,1,1,Urology & Nephrology,NA,NA,ELSEVIER ESPANA,2015-04-28 +actes de la recherche en sciences sociales,0335-5322,1955-2564,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,EDITIONS SEUIL,NA +action research,1476-7503,1741-2617,NA,0,1,0,0,NA,"Management | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,NA +active learning in higher education,1469-7874,1741-2625,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +actuators,2076-0825,2076-0825,Actuators_MDPI,0,0,1,1,"Engineering, Mechanical | Instruments & Instrumentation",NA,NA,MDPI,2017-09-27 +acupuncture & electro-therapeutics research,0360-1293,2167-9010,NA,0,0,1,0,Integrative & Complementary Medicine | Neurosciences,NA,NA,COGNIZANT COMMUNICATION CORP,NA +acupuncture in medicine,0964-5284,1759-9873,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,SAGE PUBLICATIONS LTD,NA +ad hoc & sensor wireless networks,1551-9899,1552-0633,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,OLD CITY PUBLISHING INC,NA +ad hoc networks,1570-8705,1570-8713,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,ELSEVIER,NA +adalya,1301-2746,NA,NA,1,0,0,0,NA,NA,Archaeology,KOC UNIV SUNA & INAN KIRAC RES CTR MEDITERRANEAN CIVILIZATIONS-AKMED,NA +adansonia,1280-8571,1639-4798,NA,0,0,1,0,Plant Sciences,NA,NA,"PUBLICATIONS SCIENTIFIQUES DU MUSEUM, PARIS",NA +adaptation-the journal of literature on screen studies,1755-0637,1755-0645,NA,1,0,0,0,NA,NA,"Literature | Film, Radio, Television",OXFORD UNIV PRESS,NA +adapted physical activity quarterly,0736-5829,1543-2777,NA,0,0,1,0,Rehabilitation | Sport Sciences,NA,NA,HUMAN KINETICS PUBL INC,NA +adaptive behavior,1059-7123,1741-2633,NA,0,1,1,0,"Computer Science, Artificial Intelligence","Psychology, Experimental | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,NA +adaptive behavior,1059-7123,1741-2633,NA,0,1,1,0,"Computer Science, Artificial Intelligence","Psychology, Experimental | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,NA +addiction,0965-2140,1360-0443,AddictionJrnl,0,1,1,1,Substance Abuse | Psychiatry,Substance Abuse | Psychiatry,NA,WILEY,2009-07-14 +addiction,0965-2140,1360-0443,AddictionJrnl,0,1,1,1,Substance Abuse | Psychiatry,Substance Abuse | Psychiatry,NA,WILEY,2009-07-14 +addiction biology,1355-6215,1369-1600,NA,0,0,1,0,Biochemistry & Molecular Biology | Substance Abuse,NA,NA,WILEY,NA +addiction research & theory,1606-6359,1476-7392,AddictResTheory,0,1,0,1,NA,Substance Abuse | Social Issues,NA,TAYLOR & FRANCIS LTD,2012-07-18 +addiction science & clinical practice,1940-0640,1940-0640,NA,0,1,1,0,Substance Abuse,Substance Abuse,NA,BMC,NA +addiction science & clinical practice,1940-0640,1940-0640,NA,0,1,1,0,Substance Abuse,Substance Abuse,NA,BMC,NA +addictive behaviors,0306-4603,1873-6327,NA,0,1,1,0,Substance Abuse,"Substance Abuse | Psychology, Clinical",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +addictive behaviors,0306-4603,1873-6327,NA,0,1,1,0,Substance Abuse,"Substance Abuse | Psychology, Clinical",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +additive manufacturing,2214-8604,2214-7810,AdditiveJournal,0,0,1,1,"Engineering, Manufacturing | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,2020-11-13 +adicciones,0214-4840,NA,NA,0,1,1,0,Substance Abuse,Substance Abuse,NA,SOCIDROGALCOHOL,NA +adicciones,0214-4840,NA,NA,0,1,1,0,Substance Abuse,Substance Abuse,NA,SOCIDROGALCOHOL,NA +adipocyte,2162-3945,2162-397X,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,TAYLOR & FRANCIS INC,NA +administration & society,0095-3997,1552-3039,NA,0,1,0,0,NA,Public Administration,NA,SAGE PUBLICATIONS INC,NA +administration and policy in mental health and mental health services research,0894-587X,1573-3289,NA,0,1,0,0,NA,"Health Policy & Services | Public, Environmental & Occupational Health",NA,SPRINGER,NA +administrative law review,0001-8368,2326-9154,AdLawReview,0,1,0,1,NA,Law,NA,"AMER BAR ASSOC, ADMINISTRATIVE LAW & REGULATORY PRACTICE SECTION",2010-11-22 +administrative science quarterly,0001-8392,1930-3815,ASQJournal,0,1,0,1,NA,Business | Management,NA,SAGE PUBLICATIONS INC,2014-08-18 +adolescent research review,2363-8346,2363-8354,NA,0,1,0,0,NA,"Psychology, Development | Social Sciences, Interdisciplinary",NA,SPRINGER INT PUBL AG,NA +adsorption-journal of the international adsorption society,0929-5607,1572-8757,NA,0,0,1,0,"Chemistry, Physical | Engineering, Chemical",NA,NA,SPRINGER,NA +adsorption science & technology,0263-6174,2048-4038,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Engineering, Chemical",NA,NA,SAGE PUBLICATIONS INC,NA +adult education quarterly,0741-7136,1552-3047,AEQjournal,0,1,0,1,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,2015-03-13 +advanced biology,2701-0198,2701-0198,Adv_Biology,0,0,1,1,"Materials Science, Biomaterials",NA,NA,WILEY-V C H VERLAG GMBH,2019-03-26 +advanced composite materials,0924-3046,1568-5519,NA,0,0,1,0,"Materials Science, Composites",NA,NA,TAYLOR & FRANCIS LTD,NA +advanced composites and hybrid materials,2522-0128,2522-0136,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Composites",NA,NA,SPRINGERNATURE,NA +advanced drug delivery reviews,0169-409X,1872-8294,ADDReditors,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ELSEVIER,2019-05-01 +advanced electronic materials,2199-160X,2199-160X,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,WILEY,NA +advanced energy materials,1614-6832,1614-6840,NA,0,0,1,0,"Chemistry, Physical | Energy & Fuels | Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,WILEY-V C H VERLAG GMBH,NA +advanced engineering informatics,1474-0346,1873-5320,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +advanced engineering materials,1438-1656,1527-2648,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +advanced functional materials,1616-301X,1616-3028,NA,0,0,1,0,"Chemistry, Multidisciplinary | Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,WILEY-V C H VERLAG GMBH,NA +advanced healthcare materials,2192-2640,2192-2659,NA,0,0,1,0,"Engineering, Biomedical | Nanoscience & Nanotechnology | Materials Science, Biomaterials",NA,NA,WILEY,NA +advanced materials,0935-9648,1521-4095,NA,0,0,1,0,"Chemistry, Multidisciplinary | Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,WILEY-V C H VERLAG GMBH,NA +advanced materials & processes,0882-7958,2161-9425,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ASM INT,NA +advanced materials interfaces,2196-7350,2196-7350,NA,0,0,1,0,"Chemistry, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,WILEY,NA +advanced materials technologies,2365-709X,2365-709X,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,WILEY,NA +advanced nonlinear studies,1536-1365,2169-0375,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WALTER DE GRUYTER GMBH,NA +advanced optical materials,2195-1071,2195-1071,NA,0,0,1,0,"Materials Science, Multidisciplinary | Optics",NA,NA,WILEY-V C H VERLAG GMBH,NA +advanced photonics,2577-5421,2577-5421,NA,0,0,1,0,Optics,NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +advanced powder technology,0921-8831,1568-5527,NA,0,0,1,0,"Engineering, Chemical",NA,NA,ELSEVIER,NA +advanced robotics,0169-1864,1568-5535,NA,0,0,1,0,Robotics,NA,NA,TAYLOR & FRANCIS LTD,NA +advanced science,2198-3844,2198-3844,NA,0,0,1,0,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,WILEY,NA +advanced steel construction,1816-112X,NA,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Characterization, Testing",NA,NA,HONG KONG INST STEEL CONSTRUCTION,NA +advanced sustainable systems,2366-7486,2366-7486,NA,0,0,1,0,"Green & Sustainable Science & Technology | Materials Science, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +advanced synthesis & catalysis,1615-4150,1615-4169,AdvSynthCatal,0,0,1,1,"Chemistry, Applied | Chemistry, Organic",NA,NA,WILEY-V C H VERLAG GMBH,2018-10-31 +advanced theory and simulations,2513-0390,2513-0390,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,WILEY-V C H VERLAG GMBH,NA +advanced therapeutics,2366-3987,2366-3987,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,WILEY,NA +advancements of microbiology,0079-4252,2545-3149,NA,0,0,1,0,Microbiology,NA,NA,POLSKIE TOWARZYSTWO MIKROBIOLOGOW-POLISH SOCIETY OF MICROBIOLOGISTS,NA +advances in agronomy,0065-2113,2213-6789,NA,0,0,1,0,Agronomy,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in anatomic pathology,1072-4109,1533-4031,NA,0,0,1,0,Pathology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +advances in anatomy embryology and cell biology,0301-5556,2192-7065,NA,0,0,1,0,Anatomy & Morphology | Cell Biology,NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +advances in applied ceramics,1743-6753,1743-6761,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,TAYLOR & FRANCIS LTD,NA +advances in applied clifford algebras,0188-7009,1661-4909,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,SPRINGER BASEL AG,NA +advances in applied mathematics,0196-8858,1090-2074,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +advances in applied mathematics and mechanics,2070-0733,2075-1354,NA,0,0,1,0,"Mathematics, Applied | Mechanics",NA,NA,GLOBAL SCIENCE PRESS,NA +advances in applied mechanics,0065-2156,NA,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in applied microbiology,0065-2164,NA,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in applied probability,0001-8678,1475-6064,NA,0,0,1,0,Statistics & Probability,NA,NA,APPLIED PROBABILITY TRUST,NA +advances in archaeological practice,2326-3768,2326-3768,aap_saaorg,1,0,0,1,NA,NA,Archaeology,CAMBRIDGE UNIV PRESS,2018-06-08 +advances in astronomy,1687-7969,1687-7977,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,HINDAWI LTD,NA +advances in atmospheric sciences,0256-1530,1861-9533,AASjournal,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,SCIENCE PRESS,2013-11-19 +advances in atomic molecular and optical physics,1049-250X,NA,NA,0,0,1,0,"Optics | Physics, Atomic, Molecular & Chemical",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in biochemical engineering-biotechnology,0724-6145,1616-8542,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +advances in botanical research,0065-2296,2162-5948,NA,0,0,1,0,Plant Sciences,NA,NA,ACADEMIC PRESS LTD-ELSEVIER SCIENCE LTD,NA +advances in calculus of variations,1864-8258,1864-8266,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WALTER DE GRUYTER GMBH,NA +advances in cancer research,0065-230X,2162-5557,NA,0,0,1,0,Oncology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in carbohydrate chemistry and biochemistry,0065-2318,2162-5530,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Organic",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in catalysis,0360-0564,2163-0747,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in cement research,0951-7197,1751-7605,NA,0,0,1,0,"Construction & Building Technology | Materials Science, Multidisciplinary",NA,NA,ICE PUBLISHING,NA +advances in chemical physics,0065-2385,1934-4791,NA,0,0,1,0,"Physics, Atomic, Molecular & Chemical",NA,NA,WILEY-BLACKWELL,NA +advances in child development and behavior,0065-2407,NA,NA,0,1,0,0,NA,"Psychology, Development",NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in chromatography,0065-2415,2153-991X,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,CRC PRESS-TAYLOR & FRANCIS GROUP,NA +advances in chronic kidney disease,1548-5595,1548-5609,NA,0,0,1,0,Urology & Nephrology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +advances in civil engineering,1687-8086,1687-8094,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,HINDAWI LTD,NA +advances in climate change research,1674-9278,1674-9278,NA,0,0,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,SCIENCE PRESS,NA +advances in clinical and experimental medicine,1899-5276,2451-2680,in_clinical,0,0,1,1,"Medicine, Research & Experimental",NA,NA,WROCLAW MEDICAL UNIV,NA +advances in clinical chemistry,0065-2423,2162-9471,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in cognitive psychology,1895-1171,1895-1171,AdvCognPsychol,0,1,0,1,NA,"Psychology, Experimental",NA,UNIV ECONOMICS & HUMAN SCIENCES WARSAW,2020-07-29 +advances in colloid and interface science,0001-8686,1873-3727,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER,NA +advances in complex systems,0219-5259,1793-6802,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Multidisciplinary Sciences",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +advances in computational mathematics,1019-7168,1572-9044,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER,NA +advances in computers,0065-2458,NA,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in concrete construction,2287-5301,2287-531X,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,TECHNO-PRESS,NA +advances in condensed matter physics,1687-8108,1687-8124,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,HINDAWI LTD,NA +advances in data analysis and classification,1862-5347,1862-5355,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER HEIDELBERG,NA +advances in difference equations,1687-1847,1687-1847,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER,NA +advances in differential equations,1079-9389,1079-9389,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,KHAYYAM PUBL CO INC,NA +advances in ecological research,0065-2504,2163-582X,NA,0,0,1,0,Ecology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in electrical and computer engineering,1582-7445,1844-7600,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,"UNIV SUCEAVA, FAC ELECTRICAL ENG",NA +advances in engineering software,0965-9978,1873-5339,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Software Engineering | Engineering, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +advances in experimental medicine and biology,0065-2598,2214-8019,NA,0,0,1,0,"Biology | Medicine, Research & Experimental",NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +advances in experimental social psychology,0065-2601,1557-8410,NA,0,1,0,0,NA,"Psychology, Experimental | Psychology, Social",NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in genetics,0065-2660,NA,NA,0,0,1,0,Genetics & Heredity,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in geometry,1615-715X,1615-7168,NA,0,0,1,0,Mathematics,NA,NA,WALTER DE GRUYTER GMBH,NA +advances in geophysics,0065-2687,2162-7622,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in health sciences education,1382-4996,1573-1677,advhlthsciedu,0,1,1,1,"Education, Scientific Disciplines | Health Care Sciences & Services",Education & Educational Research,NA,SPRINGER,2020-02-06 +advances in health sciences education,1382-4996,1573-1677,advhlthsciedu,0,1,1,1,"Education, Scientific Disciplines | Health Care Sciences & Services",Education & Educational Research,NA,SPRINGER,2020-02-06 +advances in heterocyclic chemistry,0065-2725,1557-8429,NA,0,0,1,0,"Chemistry, Organic",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in high energy physics,1687-7357,1687-7365,NA,0,0,1,0,"Physics, Particles & Fields",NA,NA,HINDAWI LTD,NA +advances in immunology,0065-2776,1557-8445,NA,0,0,1,0,Immunology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in inorganic chemistry,0898-8838,1557-8917,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in insect physiology,0065-2806,2213-6800,NA,0,0,1,0,Entomology,NA,NA,ACADEMIC PRESS LTD-ELSEVIER SCIENCE LTD,NA +advances in life course research,1040-2608,1040-2608,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,ELSEVIER SCI LTD,NA +advances in manufacturing,2095-3127,2195-3597,NA,0,0,1,0,"Engineering, Manufacturing | Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +advances in marine biology,0065-2881,2162-5875,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in materials science and engineering,1687-8434,1687-8442,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,HINDAWI LTD,NA +advances in mathematical physics,1687-9120,1687-9139,NA,0,0,1,0,"Physics, Mathematical",NA,NA,HINDAWI LTD,NA +advances in mathematics,0001-8708,1090-2082,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +advances in mathematics of communications,1930-5346,1930-5338,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +advances in mechanical engineering,1687-8132,1687-8140,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,SAGE PUBLICATIONS LTD,NA +advances in medical sciences,1896-1126,1898-4002,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,ELSEVIER URBAN & PARTNER SP Z O O,NA +advances in meteorology,1687-9309,1687-9317,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,HINDAWI LTD,NA +advances in methods and practices in psychological science,2515-2459,2515-2467,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +advances in methods and practices in psychological science,2515-2459,2515-2467,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +advances in microbial physiology,0065-2911,2162-5468,NA,0,0,1,0,Biochemistry & Molecular Biology | Microbiology,NA,NA,ACADEMIC PRESS LTD-ELSEVIER SCIENCE LTD,NA +advances in nano research,2287-237X,2287-2388,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,TECHNO-PRESS,NA +advances in neonatal care,1536-0903,1536-0911,ANCjournal,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2017-11-13 +advances in neonatal care,1536-0903,1536-0911,ANCjournal,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2017-11-13 +advances in nonlinear analysis,2191-9496,2191-950X,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WALTER DE GRUYTER GMBH,NA +advances in nursing science,0161-9268,1550-5014,ANSJournal,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-10-15 +advances in nursing science,0161-9268,1550-5014,ANSJournal,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-10-15 +advances in nutrition,2161-8313,2156-5376,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,OXFORD UNIV PRESS,NA +advances in optics and photonics,1943-8206,1943-8206,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC AMER,NA +advances in organometallic chemistry,0065-3055,2162-7614,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in parasitology,0065-308X,2163-6079,NA,0,0,1,0,Parasitology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in physical organic chemistry,0065-3160,2162-5921,NA,0,0,1,0,"Chemistry, Organic | Chemistry, Physical",NA,NA,ACADEMIC PRESS LTD-ELSEVIER SCIENCE LTD,NA +advances in physics,0001-8732,1460-6976,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,NA +advances in physics-x,2374-6149,2374-6149,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +advances in physiology education,1043-4046,1522-1229,AdvPhysiolEduc,0,0,1,1,"Education, Scientific Disciplines | Physiology",NA,NA,AMER PHYSIOLOGICAL SOC,2022-01-06 +advances in polymer science,0065-3195,1436-5030,NA,0,0,1,0,Polymer Science,NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +advances in polymer technology,0730-6679,1098-2329,NA,0,0,1,0,"Engineering, Chemical | Polymer Science",NA,NA,WILEY-HINDAWI,NA +advances in production engineering & management,1854-6250,1855-6531,NA,0,0,1,0,"Engineering, Manufacturing | Materials Science, Multidisciplinary",NA,NA,"UNIV MARIBOR, FAC MECHANICAL ENGINEERING",NA +advances in protein chemistry and structural biology,1876-1623,1876-1623,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in psychosomatic medicine,0065-3268,1662-2855,NA,0,0,1,0,Clinical Neurology | Psychiatry,NA,NA,KARGER,NA +advances in quantum chemistry,0065-3276,2162-8815,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in rheumatology,2523-3106,2523-3106,NA,0,0,1,0,Rheumatology,NA,NA,BMC,NA +advances in skin & wound care,1527-7941,1538-8654,aswcjournal,0,1,1,1,Dermatology | Nursing | Surgery,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-03 +advances in skin & wound care,1527-7941,1538-8654,aswcjournal,0,1,1,1,Dermatology | Nursing | Surgery,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-03 +advances in space research,0273-1177,1879-1948,NA,0,0,1,0,"Engineering, Aerospace | Astronomy & Astrophysics | Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,ELSEVIER SCI LTD,NA +advances in strategic management-a research annual,0742-3322,NA,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +advances in structural engineering,1369-4332,2048-4011,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,SAGE PUBLICATIONS INC,NA +advances in the study of behavior,0065-3454,2162-8823,NA,0,0,1,0,Behavioral Sciences,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in theoretical and mathematical physics,1095-0761,1095-0753,NA,0,0,1,0,"Physics, Particles & Fields | Physics, Mathematical",NA,NA,"INT PRESS BOSTON, INC",NA +advances in therapy,0741-238X,1865-8652,AdvancesTherapy,0,0,1,1,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,SPRINGER,2009-06-17 +advances in virus research,0065-3527,1557-8399,NA,0,0,1,0,Virology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +advances in water resources,0309-1708,1872-9657,NA,0,0,1,0,Water Resources,NA,NA,ELSEVIER SCI LTD,NA +advances in weed science,2675-9462,2675-9462,AdvancesWeedSci,0,0,1,1,Plant Sciences,NA,NA,SOC BRASILEIRA CIENCIA PLANTAS DANINHAS-SBCPD,2020-04-27 +advances in wound care,2162-1918,2162-1934,NA,0,0,1,0,Dermatology,NA,NA,"MARY ANN LIEBERT, INC",NA +aeolian research,1875-9637,2212-1684,NA,0,0,1,0,"Geography, Physical",NA,NA,ELSEVIER SCI LTD,NA +aequationes mathematicae,0001-9054,1420-8903,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +aera open,2332-8584,2332-8584,AeraOpen,0,1,0,1,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,2015-06-04 +aerobiologia,0393-5965,1573-3025,NA,0,0,1,0,Biology | Environmental Sciences,NA,NA,SPRINGER,NA +aeronautical journal,0001-9240,2059-6464,JournalAero,0,0,1,1,"Engineering, Aerospace",NA,NA,CAMBRIDGE UNIV PRESS,2012-11-17 +aerosol and air quality research,1680-8584,2071-1409,AAQR2001,0,0,1,1,Environmental Sciences,NA,NA,TAIWAN ASSOC AEROSOL RES-TAAR,2020-08-05 +aerosol science and technology,0278-6826,1521-7388,ASTJournal,0,0,1,1,"Engineering, Chemical | Engineering, Mechanical | Environmental Sciences | Meteorology & Atmospheric Sciences",NA,NA,TAYLOR & FRANCIS INC,2016-07-08 +aerospace,2226-4310,2226-4310,Aerospace_MDPI,0,0,1,1,"Engineering, Aerospace",NA,NA,MDPI,2018-06-11 +aerospace america,0740-722X,0740-722X,AeroAmMag,0,0,1,1,"Engineering, Aerospace",NA,NA,AMER INST AERONAUTICS ASTRONAUTICS,2016-08-15 +aerospace medicine and human performance,2375-6314,2375-6322,NA,0,0,1,0,"Biophysics | Public, Environmental & Occupational Health | Medicine, Research & Experimental",NA,NA,AEROSPACE MEDICAL ASSOC,NA +aerospace science and technology,1270-9638,1626-3219,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +aesthetic plastic surgery,0364-216X,1432-5241,aps_journal,0,0,1,1,Surgery,NA,NA,SPRINGER,2018-11-03 +aesthetic surgery journal,1090-820X,1527-330X,ASJrnl,0,0,1,1,Surgery,NA,NA,OXFORD UNIV PRESS INC,2014-04-14 +aeu-international journal of electronics and communications,1434-8411,1618-0399,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,ELSEVIER GMBH,NA +aevum-rassegna di scienze storiche linguistiche e filologiche,0001-9593,1827-787X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",VITA PENSIERO,NA +affilia-journal of women and social work,0886-1099,1552-3020,AffiliaJournal,0,1,0,1,NA,Social Work | Women'S Studies,NA,SAGE PUBLICATIONS INC,2017-02-14 +afinidad,0001-9704,2339-9686,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,ASOC QUIMICOS,NA +africa,0001-9720,1750-0184,AfricaIai,0,1,0,1,NA,Anthropology | Area Studies,NA,CAMBRIDGE UNIV PRESS,2016-09-21 +africa spectrum,0002-0397,1868-6869,AfricaSpectrum,0,1,0,1,NA,Area Studies,NA,SAGE PUBLICATIONS INC,NA +african affairs,0001-9909,1468-2621,AfrAfJournal,0,1,0,1,NA,Area Studies | Political Science,NA,OXFORD UNIV PRESS,2015-12-14 +african american review,1062-4783,1945-6182,afamreview,1,0,0,1,NA,NA,"Literature, American",AFRICAN AMER REVIEW,2020-07-11 +african and asian studies,1569-2094,1569-2108,NA,0,1,0,0,NA,Area Studies,NA,BRILL,NA +african archaeological review,0263-0338,1572-9842,NA,1,1,0,0,NA,Anthropology,Archaeology,SPRINGER,NA +african archaeological review,0263-0338,1572-9842,NA,1,1,0,0,NA,Anthropology,Archaeology,SPRINGER,NA +african arts,0001-9933,1937-2108,NA,1,0,0,0,NA,NA,Art,MIT PRESS,NA +african development review-revue africaine de developpement,1017-6772,1467-8268,NA,0,1,0,0,NA,Development Studies,NA,WILEY,NA +african economic history,0145-2258,2163-9108,AfricanEconHist,1,0,0,1,NA,NA,History,"UNIV WISCONSIN MADISON, AFRICAN STUDIES PROGRAM",2020-02-21 +african entomology,1021-3589,1026-4914,NA,0,0,1,0,Entomology,NA,NA,ENTOMOLOGICAL SOC SOUTHERN AFRICA,NA +african health sciences,1680-6905,1729-0503,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,"MAKERERE UNIV, FAC MED",NA +african invertebrates,1681-5556,2305-2562,AI_Journal,0,0,1,1,Entomology | Paleontology | Zoology,NA,NA,COUNCIL NATAL MUSEUM,2016-01-27 +african journal of aquatic science,1608-5914,1727-9364,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +african journal of ecology,0141-6707,1365-2028,NA,0,0,1,0,Ecology,NA,NA,WILEY,NA +african journal of emergency medicine,2211-419X,2211-4203,AfJEM,0,0,1,1,Emergency Medicine,NA,NA,ELSEVIER,2011-12-06 +african journal of herpetology,2156-4574,2153-3660,NA,0,0,1,0,Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +african journal of library archives and information science,0795-4778,0795-4778,NA,0,1,0,0,NA,Information Science & Library Science,NA,ARCHLIB & INFORMATION SERVICES LTD,NA +african journal of marine science,1814-232X,1814-2338,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +african journal of range & forage science,1022-0119,1727-9380,NA,0,0,1,0,Ecology | Environmental Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +african journal of reproductive health,1118-4841,2141-3606,AJRHJOURNAL,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,WOMENS HEALTH & ACTION RESEARCH CENTRE,2019-05-28 +african journal of wildlife research,2410-7220,2410-8200,NA,0,0,1,0,Ecology | Zoology,NA,NA,SOUTHERN AFRICAN WILDLIFE MANAGEMENT ASSOC,NA +african journalism studies,2374-3670,2374-3689,AfrJournStud,0,1,0,1,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-10-06 +african studies,0002-0184,1469-2872,afrikanstudies,0,1,0,1,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-06-09 +african studies review,0002-0206,1555-2462,ASRJournal,0,1,0,1,NA,Area Studies,NA,CAMBRIDGE UNIV PRESS,2014-02-14 +african zoology,1562-7020,2224-073X,africanzoology,0,0,1,1,Zoology,NA,NA,TAYLOR & FRANCIS LTD,2016-12-04 +africana linguistica,2033-8732,2034-8436,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,PEETERS,NA +africana linguistica,2033-8732,2034-8436,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,PEETERS,NA +afterall,1465-4253,2156-4914,AfterallJournal,1,0,0,1,NA,NA,Art,UNIV CHICAGO PRESS,2010-10-13 +age and ageing,0002-0729,1468-2834,Age_and_Ageing,0,0,1,1,Geriatrics & Gerontology,NA,NA,OXFORD UNIV PRESS,2011-07-20 +ageing & society,0144-686X,1469-1779,Ageing_Society,0,1,0,1,NA,Gerontology,NA,CAMBRIDGE UNIV PRESS,2017-06-30 +ageing research reviews,1568-1637,1872-9649,NA,0,0,1,0,Cell Biology | Geriatrics & Gerontology,NA,NA,ELSEVIER IRELAND LTD,NA +agenda,0002-0796,1013-0950,agendapoetry,1,0,0,1,NA,NA,Poetry,AGENDA MAGAZINE ED CHAR TRUST,2012-02-06 +aggression and violent behavior,1359-1789,1873-6335,NA,0,1,0,0,NA,"Criminology & Penology | Psychology, Multidisciplinary",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +aggressive behavior,0096-140X,1098-2337,NA,0,1,1,0,Behavioral Sciences,"Psychology, Multidisciplinary",NA,WILEY,NA +aggressive behavior,0096-140X,1098-2337,NA,0,1,1,0,Behavioral Sciences,"Psychology, Multidisciplinary",NA,WILEY,NA +aging-us,1945-4589,0002-0966,AgingJrnl,0,0,1,1,Cell Biology | Geriatrics & Gerontology,NA,NA,IMPACT JOURNALS LLC,2016-02-25 +aging & mental health,1360-7863,1364-6915,AgingMH,0,1,1,1,Geriatrics & Gerontology | Psychiatry,Psychiatry | Gerontology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-07 +aging & mental health,1360-7863,1364-6915,AgingMH,0,1,1,1,Geriatrics & Gerontology | Psychiatry,Psychiatry | Gerontology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-07 +aging and disease,2152-5250,2152-5250,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,INT SOC AGING & DISEASE,NA +aging cell,1474-9718,1474-9726,AgingCell,0,0,1,1,Cell Biology | Geriatrics & Gerontology,NA,NA,WILEY,2010-09-29 +aging clinical and experimental research,1594-0667,1720-8319,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,SPRINGER,NA +aging male,1368-5538,1473-0790,NA,0,0,1,0,Endocrinology & Metabolism | Urology & Nephrology,NA,NA,TAYLOR & FRANCIS LTD,NA +aging neuropsychology and cognition,1382-5585,1744-4128,NA,0,1,0,0,NA,"Psychology, Development | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +agora-estudos classicos em debate,0874-5498,NA,NA,1,0,0,0,NA,NA,Classics,UNIV AVEIRO,NA +agrarforschung schweiz,1663-7852,1663-7909,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,AGRARFORSCHUNG,NA +agrekon,0303-1853,2078-0400,NA,0,0,1,0,Agricultural Economics & Policy,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +agribusiness,0742-4477,1520-6297,NA,0,1,1,0,Agricultural Economics & Policy | Food Science & Technology,Economics,NA,WILEY,NA +agribusiness,0742-4477,1520-6297,NA,0,1,1,0,Agricultural Economics & Policy | Food Science & Technology,Economics,NA,WILEY,NA +agricultural & environmental letters,2471-9625,2471-9625,NA,0,0,1,0,"Agriculture, Multidisciplinary | Environmental Sciences",NA,NA,WILEY,NA +agricultural and food economics,2193-7532,2193-7532,NA,0,1,0,0,NA,Economics | Agricultural Economics & Policy,NA,SPRINGERNATURE,NA +agricultural and food science,1459-6067,1795-1895,NA,0,0,1,0,"Agriculture, Multidisciplinary | Food Science & Technology",NA,NA,SCIENTIFIC AGRICULTURAL SOC FINLAND,NA +agricultural and forest entomology,1461-9555,1461-9563,AFEntomology,0,0,1,1,Entomology,NA,NA,WILEY,2014-04-06 +agricultural and forest meteorology,0168-1923,1873-2240,agformet,0,0,1,1,Agronomy | Forestry | Meteorology & Atmospheric Sciences,NA,NA,ELSEVIER,2020-06-16 +agricultural economics,0169-5150,1574-0862,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,WILEY,NA +agricultural economics,0169-5150,1574-0862,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,WILEY,NA +agricultural economics-zemedelska ekonomika,0139-570X,1805-9295,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +agricultural economics-zemedelska ekonomika,0139-570X,1805-9295,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +agricultural history,0002-1482,1533-8290,NA,1,1,1,0,History & Philosophy Of Science,History | History & Philosophy Of Science,History | History & Philosophy Of Science,AGRICULTURAL HISTORY SOCIETY,NA +agricultural history,0002-1482,1533-8290,NA,1,1,1,0,History & Philosophy Of Science,History | History & Philosophy Of Science,History | History & Philosophy Of Science,AGRICULTURAL HISTORY SOCIETY,NA +agricultural history,0002-1482,1533-8290,NA,1,1,1,0,History & Philosophy Of Science,History | History & Philosophy Of Science,History | History & Philosophy Of Science,AGRICULTURAL HISTORY SOCIETY,NA +agricultural history review,0002-1490,0002-1490,NA,1,0,0,0,NA,NA,History,BRITISH AGRICULTURAL HISTORY SOC,NA +agricultural systems,0308-521X,1873-2267,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +agricultural water management,0378-3774,1873-2283,NA,0,0,1,0,Agronomy | Water Resources,NA,NA,ELSEVIER,NA +agriculture-basel,2077-0472,2077-0472,AgricultureMdpi,0,0,1,1,Agronomy,NA,NA,MDPI,2018-01-26 +agriculture and human values,0889-048X,1572-8366,NA,0,1,1,0,"Agriculture, Multidisciplinary | History & Philosophy Of Science",History & Philosophy Of Science | Sociology,NA,SPRINGER,NA +agriculture and human values,0889-048X,1572-8366,NA,0,1,1,0,"Agriculture, Multidisciplinary | History & Philosophy Of Science",History & Philosophy Of Science | Sociology,NA,SPRINGER,NA +agriculture ecosystems & environment,0167-8809,1873-2305,NA,0,0,1,0,"Agriculture, Multidisciplinary | Ecology | Environmental Sciences",NA,NA,ELSEVIER,NA +agrochimica,0002-1857,NA,NA,0,0,1,0,"Chemistry, Applied | Soil Science",NA,NA,PISA UNIV PRESS,NA +agrociencia,1405-3195,2521-9766,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,COLEGIO POSTGRADUADOS,NA +agroecology and sustainable food systems,2168-3565,2168-3573,NA,0,0,1,0,"Agriculture, Multidisciplinary | Green & Sustainable Science & Technology",NA,NA,TAYLOR & FRANCIS INC,NA +agroforestry systems,0167-4366,1572-9680,NA,0,0,1,0,Agronomy | Forestry,NA,NA,SPRINGER,NA +agronomy-basel,2073-4395,2073-4395,Agronomy_Mdpi,0,0,1,1,Agronomy | Plant Sciences,NA,NA,MDPI,2016-11-30 +agronomy for sustainable development,1774-0746,1773-0155,ASD_INRAE,0,0,1,1,Agronomy | Green & Sustainable Science & Technology,NA,NA,SPRINGER FRANCE,2011-08-26 +agronomy journal,0002-1962,1435-0645,AgronomyJournal,0,0,1,1,Agronomy,NA,NA,WILEY,2015-03-03 +ai communications,0921-7126,1875-8452,AI_Comms,0,0,1,1,"Computer Science, Artificial Intelligence",NA,NA,IOS PRESS,2018-12-04 +ai edam-artificial intelligence for engineering design analysis and manufacturing,0890-0604,1469-1760,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications | Engineering, Multidisciplinary | Engineering, Manufacturing",NA,NA,CAMBRIDGE UNIV PRESS,NA +ai magazine,0738-4602,0738-4602,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,AMER ASSOC ARTIFICIAL INTELL,NA +aiaa journal,0001-1452,1533-385X,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,AMER INST AERONAUTICS ASTRONAUTICS,NA +aibr-revista de antropologia iberoamericana,1695-9752,1578-9705,NA,0,1,0,0,NA,Anthropology,NA,ASOC ANTROPOLOGOS IBEROAMERICANOS EN RED,NA +aiche journal,0001-1541,1547-5905,NA,0,0,1,0,"Engineering, Chemical",NA,NA,WILEY,NA +aids,0269-9370,1473-5571,AIDS_Journal,0,0,1,1,Immunology | Infectious Diseases | Virology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-11-23 +aids and behavior,1090-7165,1573-3254,AIDSandBehavior,0,1,0,1,NA,"Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,SPRINGER/PLENUM PUBLISHERS,2011-09-11 +aids care-psychological and socio-medical aspects of aids/hiv,0954-0121,1360-0451,NA,0,1,0,0,NA,"Health Policy & Services | Public, Environmental & Occupational Health | Psychology, Multidisciplinary | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +aids education and prevention,0899-9546,1943-2755,NA,0,1,0,0,NA,"Education & Educational Research | Public, Environmental & Occupational Health",NA,GUILFORD PUBLICATIONS INC,NA +aids patient care and stds,1087-2914,1557-7449,NA,0,1,1,0,Infectious Diseases,"Public, Environmental & Occupational Health",NA,"MARY ANN LIEBERT, INC",NA +aids patient care and stds,1087-2914,1557-7449,NA,0,1,1,0,Infectious Diseases,"Public, Environmental & Occupational Health",NA,"MARY ANN LIEBERT, INC",NA +aids research and human retroviruses,0889-2229,1931-8405,NA,0,0,1,0,Immunology | Infectious Diseases | Virology,NA,NA,"MARY ANN LIEBERT, INC",NA +aids research and therapy,1742-6405,1742-6405,NA,0,0,1,0,Infectious Diseases,NA,NA,BMC,NA +aids reviews,1139-6121,1698-6997,NA,0,0,1,0,Immunology | Infectious Diseases,NA,NA,PERMANYER PUBL,NA +aims mathematics,2473-6988,2473-6988,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +ain shams engineering journal,2090-4479,2090-4495,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,ELSEVIER,NA +aip advances,2158-3226,2158-3226,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,AIP PUBLISHING,NA +air quality atmosphere and health,1873-9318,1873-9326,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +aircraft engineering and aerospace technology,1748-8842,1758-4213,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +ajar-african journal of aids research,1608-5906,1727-9445,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,NA +ajar-african journal of aids research,1608-5906,1727-9445,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,NA +ajidd-american journal on intellectual and developmental disabilities,1944-7515,1944-7558,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,AMER ASSOC INTELLECTUAL DEVELOPMENTAL DISABILITIES,NA +ajs review-the journal of the association for jewish studies,0364-0094,1475-4541,NA,1,0,0,0,NA,NA,History | Religion,CAMBRIDGE UNIV PRESS,NA +akce international journal of graphs and combinatorics,0972-8600,2543-3474,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,TAYLOR & FRANCIS LTD,NA +akkadica,1378-5087,0779-7842,NA,1,0,0,0,NA,NA,Archaeology,ASSYRIOLOGICAL CENT GEORGES DOSSIN,NA +aktuelle rheumatologie,0341-051X,1438-9940,NA,0,0,1,0,Rheumatology,NA,NA,GEORG THIEME VERLAG KG,NA +aktuelle urologie,0001-7868,1438-8820,NA,0,0,1,0,Urology & Nephrology,NA,NA,GEORG THIEME VERLAG KG,NA +akzente-zeitschrift fur literatur,0002-3957,NA,NA,1,0,0,0,NA,NA,Literary Reviews,CARL HANSER VERLAG,NA +al-masaq-journal of the medieval mediterranean,0950-3110,1473-348X,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +al-qantara,0211-3589,1988-2955,NA,1,0,0,0,NA,NA,History | Religion,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +al-shajarah,1394-6870,1394-6870,NA,1,0,0,0,NA,NA,Religion,"INT ISLAMIC UNIV MALAYSIA, INT INST ISLAMIC THOUGHT & CIVILIZATION",NA +alcheringa,0311-5518,1752-0754,NA,0,0,1,0,Paleontology,NA,NA,TAYLOR & FRANCIS LTD,NA +alcohol,0741-8329,1873-6823,JournalAlcohol,0,0,1,1,Substance Abuse | Pharmacology & Pharmacy | Toxicology,NA,NA,ELSEVIER SCIENCE INC,2018-07-17 +alcohol and alcoholism,0735-0414,1464-3502,NA,0,1,1,0,Substance Abuse,Substance Abuse,NA,OXFORD UNIV PRESS,NA +alcohol and alcoholism,0735-0414,1464-3502,NA,0,1,1,0,Substance Abuse,Substance Abuse,NA,OXFORD UNIV PRESS,NA +alcohol research-current reviews,1535-7414,1930-0573,NA,0,1,0,0,NA,Substance Abuse,NA,"NATL INST ALCOHOL ABUSE ALCOHOLISM",NA +alcoholism-clinical and experimental research,0145-6008,1530-0277,NA,0,0,1,0,Substance Abuse,NA,NA,WILEY,NA +aldrichimica acta,0002-5100,NA,NA,0,0,1,0,"Chemistry, Organic",NA,NA,ALDRICH CHEMICAL CO INC,NA +alea-estudos neolatinos,1517-106X,1807-0299,NA,1,0,0,0,NA,NA,"Literature, Romance","UNIV FED RIO DE JANEIRO, FAC LETRAS",NA +alea-latin american journal of probability and mathematical statistics,1980-0436,NA,NA,0,0,1,0,Statistics & Probability,NA,NA,IMPA,NA +aleph-historical studies in science & judaism,1565-1525,1565-5423,NA,1,0,0,0,NA,NA,History & Philosophy Of Science | Religion,INDIANA UNIV PRESS,NA +alexandria engineering journal,1110-0168,2090-2670,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,ELSEVIER,NA +algae,1226-2617,2093-0860,NA,0,0,1,0,Plant Sciences | Marine & Freshwater Biology,NA,NA,KOREAN SOC PHYCOLOGY,NA +algal research-biomass biofuels and bioproducts,2211-9264,2211-9264,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,ELSEVIER,NA +algebra & number theory,1937-0652,1944-7833,NA,0,0,1,0,Mathematics,NA,NA,MATHEMATICAL SCIENCE PUBL,NA +algebra and logic,0002-5232,1573-8302,NA,0,0,1,0,Mathematics | Logic,NA,NA,SPRINGER,NA +algebra colloquium,1005-3867,0219-1733,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +algebra universalis,0002-5240,1420-8911,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER BASEL AG,NA +algebraic and geometric topology,1472-2739,1472-2739,NA,0,0,1,0,Mathematics,NA,NA,GEOMETRY & TOPOLOGY PUBLICATIONS,NA +algebraic geometry,2313-1691,2214-2584,NA,0,0,1,0,Mathematics,NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +algebras and representation theory,1386-923X,1572-9079,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +algorithmica,0178-4617,1432-0541,NA,0,0,1,0,"Computer Science, Software Engineering | Mathematics, Applied",NA,NA,SPRINGER,NA +algorithms for molecular biology,1748-7188,1748-7188,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology | Mathematical & Computational Biology,NA,NA,BMC,NA +alimentary pharmacology & therapeutics,0269-2813,1365-2036,NA,0,0,1,0,Gastroenterology & Hepatology | Pharmacology & Pharmacy,NA,NA,WILEY,NA +all earth,NA,2766-9645,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +all life,2689-5293,2689-5307,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +allelopathy journal,0971-4693,0973-5046,NA,0,0,1,0,Agronomy,NA,NA,ALLELOPATHY JOURNAL,NA +allergologia et immunopathologia,0301-0546,1578-1267,alletimm,0,0,1,1,Allergy | Immunology,NA,NA,CODON PUBLICATIONS,2020-10-09 +allergologie,0344-5062,0344-5062,NA,0,0,1,0,Allergy,NA,NA,DUSTRI-VERLAG DR KARL FEISTLE,NA +allergology international,1323-8930,1440-1592,NA,0,0,1,0,Allergy | Immunology,NA,NA,JAPANESE SOCIETY ALLERGOLOGY,NA +allergy,0105-4538,1398-9995,NA,0,0,1,0,Allergy | Immunology,NA,NA,WILEY,NA +allergy and asthma proceedings,1088-5412,1539-6304,NA,0,0,1,0,Allergy,NA,NA,OCEAN SIDE PUBLICATIONS INC,NA +allergy asthma & immunology research,2092-7355,2092-7363,NA,0,0,1,0,Allergy | Immunology,NA,NA,KOREAN ACAD ASTHMA ALLERGY & CLINICAL IMMUNOLOGY,NA +allergy asthma and clinical immunology,1710-1492,1710-1492,NA,0,0,1,0,Allergy | Immunology,NA,NA,BMC,NA +allgemeine forst und jagdzeitung,0002-5852,NA,NA,0,0,1,0,Forestry,NA,NA,J D SAUERLAENDERS VERLAG,NA +allgemeine zeitschrift fur philosophie,0340-7969,NA,NA,1,0,0,0,NA,NA,Philosophy,FROMMANN-HOLZBOOG,NA +alpha-revista de artes letras y filosofia,0716-4254,0718-2201,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV LOS LAGOS,NA +alpha psychiatry,NA,2757-8038,AlphaPsychiatry,0,0,1,1,Psychiatry,NA,NA,AVES,2020-12-28 +alpine botany,1664-2201,1664-221X,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER BASEL AG,NA +alternative therapies in health and medicine,1078-6791,1078-6791,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,INNOVISION COMMUNICATIONS,NA +alternatives,0304-3754,2163-3150,NA,0,1,0,0,NA,International Relations,NA,SAGE PUBLICATIONS INC,NA +altex-alternatives to animal experimentation,1868-596X,1868-8551,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,SPEKTRUM AKADEMISCHER VERLAG-SPRINGER-VERLAG GMBH,NA +alzheimer disease & associated disorders,0893-0341,0893-0341,NA,0,0,1,0,Clinical Neurology | Pathology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +alzheimers & dementia,1552-5260,1552-5279,NA,0,0,1,0,Clinical Neurology,NA,NA,WILEY,NA +alzheimers research & therapy,1758-9193,1758-9193,AlzheimersRes,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,BMC,2013-02-20 +ama-agricultural mechanization in asia africa and latin america,0084-5841,NA,NA,0,0,1,0,Agricultural Engineering,NA,NA,FARM MACHINERY INDUSTRIAL RESEARCH CORP,NA +amb express,2191-0855,2191-0855,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,SPRINGER,NA +ambio,0044-7447,1654-7209,Ambio_Journal,0,0,1,1,"Engineering, Environmental | Environmental Sciences",NA,NA,SPRINGER,2013-04-29 +ambix,0002-6980,1745-8234,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,TAYLOR & FRANCIS LTD,NA +ambix,0002-6980,1745-8234,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,TAYLOR & FRANCIS LTD,NA +ameghiniana,0002-7014,1851-8044,NA,0,0,1,0,Paleontology,NA,NA,ASOCIACION PALEONTOLOGICA ARGENTINA,NA +amerasia journal,0044-7471,0044-7471,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",TAYLOR & FRANCIS INC,NA +american annals of the deaf,0002-726X,1543-0375,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,GALLAUDET UNIV PRESS,NA +american anthropologist,0002-7294,1548-1433,AmAnthroJournal,0,1,0,1,NA,Anthropology,NA,WILEY,2016-06-29 +american antiquity,0002-7316,2325-5064,NA,1,1,0,0,NA,Anthropology,Archaeology,CAMBRIDGE UNIV PRESS,NA +american antiquity,0002-7316,2325-5064,NA,1,1,0,0,NA,Anthropology,Archaeology,CAMBRIDGE UNIV PRESS,NA +american art,1073-9300,1549-6503,NA,1,0,0,0,NA,NA,Art,UNIV CHICAGO PRESS,NA +american bankruptcy law journal,0027-9048,NA,NA,0,1,0,0,NA,Law,NA,"NATL CONF BANKRUPT J",NA +american behavioral scientist,0002-7642,1552-3381,ABSjournal,0,1,0,1,NA,"Psychology, Clinical | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,2010-08-28 +american biology teacher,0002-7685,1938-4211,ameghiniana,0,0,1,1,"Biology | Education, Scientific Disciplines",NA,NA,"NATL ASSOC BIOLOGY TEACHERS INC",2015-01-27 +american book review,0149-9408,2153-4578,Amerbookreview,1,0,0,1,NA,NA,Literature,"UNIV HOUSTON, VICTORIA-ART & SCI",2016-10-24 +american business law journal,0002-7766,1744-1714,the_ablj,0,1,0,1,NA,Business | Law,NA,WILEY,2017-08-10 +american catholic philosophical quarterly,1051-3558,2153-8441,NA,1,0,0,0,NA,NA,Philosophy,AMER CATHOLIC PHILOSOPHICAL ASSOC,NA +american ceramic society bulletin,0002-7812,1945-2705,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,AMER CERAMIC SOC,NA +american criminal law review,0164-0364,0164-0364,AmCrimLRev,0,1,0,1,NA,Law,NA,AMER CRIMINAL LAW REVIEW,2013-11-07 +american economic journal-applied economics,1945-7782,1945-7790,NA,0,1,0,0,NA,Economics,NA,AMER ECONOMIC ASSOC,NA +american economic journal-economic policy,1945-7731,1945-774X,NA,0,1,0,0,NA,Economics,NA,AMER ECONOMIC ASSOC,NA +american economic journal-macroeconomics,1945-7707,1945-7715,NA,0,1,0,0,NA,Economics,NA,AMER ECONOMIC ASSOC,NA +american economic journal-microeconomics,1945-7669,1945-7685,NA,0,1,0,0,NA,Economics,NA,AMER ECONOMIC ASSOC,NA +american economic review,0002-8282,1944-7981,NA,0,1,0,0,NA,Economics,NA,AMER ECONOMIC ASSOC,NA +american educational research journal,0002-8312,1935-1011,aerj_journal,0,1,0,1,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,2021-12-03 +american ethnologist,0094-0496,1548-1425,AmEthno,0,1,0,1,NA,Anthropology,NA,WILEY,2011-11-07 +american family physician,0002-838X,1532-0650,AFPJournal,0,0,1,1,"Primary Health Care | Medicine, General & Internal",NA,NA,AMER ACAD FAMILY PHYSICIANS,2009-12-11 +american fern journal,0002-8444,1938-422X,NA,0,0,1,0,Plant Sciences,NA,NA,AMER FERN SOC INC,NA +american health and drug benefits,1942-2962,1942-2970,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,ENGAGE HEALTHCARE COMMUNICATIONS INC,NA +american health and drug benefits,1942-2962,1942-2970,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,ENGAGE HEALTHCARE COMMUNICATIONS INC,NA +american heart journal,0002-8703,1097-6744,AmericanHeartJ,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,MOSBY-ELSEVIER,2016-02-09 +american historical review,0002-8762,1937-5239,AmHistReview,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2017-08-22 +american historical review,0002-8762,1937-5239,AmHistReview,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2017-08-22 +american history,1076-8866,NA,NA,1,0,0,0,NA,NA,History,HISTORYNET,NA +american imago,0065-860X,1085-7931,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,NA +american indian and alaska native mental health research,1533-7731,1533-7731,NA,0,1,0,0,NA,"Psychology, Clinical",NA,UNIV PRESS COLORADO,NA +american indian culture and research journal,0161-6463,0161-6463,NA,1,0,0,0,NA,NA,History,"U C L A, AMER INDIAN STUDIES CENTER",NA +american jewish history,0164-0178,1086-3141,NA,1,0,0,0,NA,NA,History,JOHNS HOPKINS UNIV PRESS,NA +american journal of agricultural economics,0002-9092,1467-8276,AJAE_AAEA,0,1,1,1,Agricultural Economics & Policy,Economics,NA,WILEY,2018-08-16 +american journal of agricultural economics,0002-9092,1467-8276,AJAE_AAEA,0,1,1,1,Agricultural Economics & Policy,Economics,NA,WILEY,2018-08-16 +american journal of alzheimers disease and other dementias,1533-3175,1938-2731,NA,0,0,1,0,Geriatrics & Gerontology | Clinical Neurology,NA,NA,SAGE PUBLICATIONS INC,NA +american journal of archaeology,0002-9114,1939-828X,NA,1,0,0,0,NA,NA,Archaeology,UNIV CHICAGO PRESS,NA +american journal of audiology,1059-0889,1558-9137,NA,0,0,1,0,Audiology & Speech-Language Pathology | Otorhinolaryngology,NA,NA,AMER SPEECH-LANGUAGE-HEARING ASSOC,NA +american journal of bioethics,1526-5161,1536-0075,bioethics_net,0,1,1,1,Medical Ethics,"Ethics | Social Issues | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2008-07-20 +american journal of bioethics,1526-5161,1536-0075,bioethics_net,0,1,1,1,Medical Ethics,"Ethics | Social Issues | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2008-07-20 +american journal of botany,0002-9122,1537-2197,NA,0,0,1,0,Plant Sciences,NA,NA,WILEY,NA +american journal of cancer research,2156-6976,2156-6976,NA,0,0,1,0,Oncology,NA,NA,E-CENTURY PUBLISHING CORP,NA +american journal of cardiology,0002-9149,1879-1913,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,EXCERPTA MEDICA INC-ELSEVIER SCIENCE INC,NA +american journal of cardiovascular drugs,1175-3277,1179-187X,NA,0,0,1,0,Cardiac & Cardiovascular System | Pharmacology & Pharmacy,NA,NA,ADIS INT LTD,NA +american journal of chinese medicine,0192-415X,1793-6853,NA,0,0,1,0,"Integrative & Complementary Medicine | Medicine, General & Internal",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +american journal of clinical dermatology,1175-0561,1179-1888,NA,0,0,1,0,Dermatology,NA,NA,ADIS INT LTD,NA +american journal of clinical hypnosis,0002-9157,2160-0562,NA,0,1,0,0,NA,"Psychology, Clinical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +american journal of clinical nutrition,0002-9165,1938-3207,AJCNutrition,0,0,1,1,Nutrition & Dietetics,NA,NA,OXFORD UNIV PRESS,2020-07-28 +american journal of clinical oncology-cancer clinical trials,0277-3732,1537-453X,NA,0,0,1,0,Oncology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +american journal of clinical pathology,0002-9173,1943-7722,AJCPjournal,0,0,1,1,Pathology,NA,NA,OXFORD UNIV PRESS INC,2019-06-18 +american journal of community psychology,0091-0562,1573-2770,A_J_Comm_Psych,0,1,0,1,NA,"Public, Environmental & Occupational Health | Psychology, Multidisciplinary | Social Work",NA,WILEY,2020-08-21 +american journal of comparative law,0002-919X,2326-9197,NA,0,1,0,0,NA,Law,NA,OXFORD UNIV PRESS INC,NA +american journal of criminal justice,1066-2316,1936-1351,AJCJ_UNF,0,1,0,1,NA,Criminology & Penology,NA,SPRINGER,NA +american journal of critical care,1062-3264,1937-710X,ajccme,0,0,1,1,Critical Care Medicine | Nursing,NA,NA,AMER ASSOC CRITICAL CARE NURSES,NA +american journal of cultural sociology,2049-7113,2049-7121,CulturalSociol,0,1,0,1,NA,Sociology,NA,PALGRAVE MACMILLAN LTD,2012-01-27 +american journal of dentistry,0894-8275,NA,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,"MOSHER & LINDER, INC",NA +american journal of dermatopathology,0193-1091,1533-0311,NA,0,0,1,0,Dermatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +american journal of drug and alcohol abuse,0095-2990,1097-9891,AJDAAJournal,0,1,1,1,Substance Abuse,"Substance Abuse | Psychology, Clinical",NA,TAYLOR & FRANCIS INC,2019-04-01 +american journal of drug and alcohol abuse,0095-2990,1097-9891,AJDAAJournal,0,1,1,1,Substance Abuse,"Substance Abuse | Psychology, Clinical",NA,TAYLOR & FRANCIS INC,2019-04-01 +american journal of economics and sociology,0002-9246,1536-7150,NA,0,1,0,0,NA,Economics | Sociology,NA,WILEY,NA +american journal of education,0195-6744,1549-6511,NA,0,1,0,0,NA,Education & Educational Research,NA,UNIV CHICAGO PRESS,NA +american journal of emergency medicine,0735-6757,1532-8171,NA,0,0,1,0,Emergency Medicine,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +american journal of enology and viticulture,0002-9254,1943-7749,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology | Horticulture,NA,NA,AMER SOC ENOLOGY VITICULTURE,NA +american journal of epidemiology,0002-9262,1476-6256,AmJEpi,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,OXFORD UNIV PRESS INC,2014-08-28 +american journal of evaluation,1098-2140,1557-0878,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +american journal of family therapy,0192-6187,1521-0383,NA,0,1,0,0,NA,"Psychology, Clinical | Family Studies",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +american journal of forensic medicine and pathology,0195-7910,1533-404X,amjforensicmed,0,0,1,1,"Medicine, Legal | Pathology",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-07-12 +american journal of gastroenterology,0002-9270,1572-0241,AmJGastro,0,0,1,1,Gastroenterology & Hepatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2020-07-31 +american journal of geriatric psychiatry,1064-7481,1545-7214,AmJGeriPsych,0,1,1,1,Geriatrics & Gerontology | Psychiatry,Psychiatry | Gerontology,NA,ELSEVIER SCIENCE INC,2016-01-09 +american journal of geriatric psychiatry,1064-7481,1545-7214,AmJGeriPsych,0,1,1,1,Geriatrics & Gerontology | Psychiatry,Psychiatry | Gerontology,NA,ELSEVIER SCIENCE INC,2016-01-09 +american journal of health-system pharmacy,1079-2082,1535-2900,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,OXFORD UNIV PRESS INC,NA +american journal of health behavior,1945-7359,1945-7359,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,PNG PUBLICATIONS,NA +american journal of health economics,2332-3493,2332-3507,AJHE_journal,0,1,0,1,NA,Economics | Health Policy & Services,NA,UNIV CHICAGO PRESS,2014-06-13 +american journal of health promotion,0890-1171,2168-6602,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +american journal of hematology,0361-8609,1096-8652,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +american journal of hospice & palliative medicine,1049-9091,1938-2715,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,SAGE PUBLICATIONS INC,NA +american journal of human biology,1042-0533,1520-6300,NA,0,1,1,0,Biology,Anthropology,NA,WILEY,NA +american journal of human biology,1042-0533,1520-6300,NA,0,1,1,0,Biology,Anthropology,NA,WILEY,NA +american journal of human genetics,0002-9297,1537-6605,AJHGNews,0,0,1,1,Genetics & Heredity,NA,NA,CELL PRESS,2011-12-17 +american journal of hypertension,0895-7061,1941-7225,amjhypertension,0,0,1,1,Peripheral Vascular Diseases,NA,NA,OXFORD UNIV PRESS,2021-12-09 +american journal of industrial medicine,0271-3586,1097-0274,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,WILEY,NA +american journal of infection control,0196-6553,1527-3296,AJICJournal,0,0,1,1,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,MOSBY-ELSEVIER,2011-07-05 +american journal of international law,0002-9300,2161-7953,AJIL_andUnbound,0,1,0,1,NA,International Relations | Law,NA,CAMBRIDGE UNIV PRESS,2015-07-14 +american journal of kidney diseases,0272-6386,1523-6838,AJKDonline,0,0,1,1,Urology & Nephrology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2011-12-15 +american journal of law & medicine,0098-8588,2375-835X,american journal of occupational therapy,0,1,0,1,NA,Law,NA,CAMBRIDGE UNIV PRESS,2018-08-26 +american journal of managed care,1088-0224,1936-2692,AJMC_Journal,0,1,1,1,"Health Care Sciences & Services | Medicine, General & Internal",Health Policy & Services,NA,MANAGED CARE & HEALTHCARE COMMUNICATIONS LLC,2009-07-10 +american journal of managed care,1088-0224,1936-2692,AJMC_Journal,0,1,1,1,"Health Care Sciences & Services | Medicine, General & Internal",Health Policy & Services,NA,MANAGED CARE & HEALTHCARE COMMUNICATIONS LLC,2009-07-10 +american journal of mathematics,0002-9327,1080-6377,NA,0,0,1,0,Mathematics,NA,NA,JOHNS HOPKINS UNIV PRESS,NA +american journal of medical genetics part a,1552-4825,1552-4833,NA,0,0,1,0,Genetics & Heredity,NA,NA,WILEY,NA +american journal of medical genetics part b-neuropsychiatric genetics,1552-4841,1552-485X,NA,0,0,1,0,Genetics & Heredity | Psychiatry,NA,NA,WILEY,NA +american journal of medical genetics part c-seminars in medical genetics,1552-4868,1552-4876,NA,0,0,1,0,Genetics & Heredity,NA,NA,WILEY,NA +american journal of medical quality,1062-8606,1555-824X,AjmQonline,0,0,1,1,Health Care Sciences & Services,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2021-02-18 +american journal of medicine,0002-9343,1555-7162,amjmed,0,0,1,1,"Medicine, General & Internal",NA,NA,ELSEVIER SCIENCE INC,2014-04-03 +american journal of mens health,1557-9883,1557-9891,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +american journal of nephrology,0250-8095,1421-9670,NA,0,0,1,0,Urology & Nephrology,NA,NA,KARGER,NA +american journal of neuroradiology,0195-6108,1936-959X,TheAJNR,0,0,1,1,"Clinical Neurology | Neuroimaging | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,AMER SOC NEURORADIOLOGY,2013-01-15 +american journal of nursing,0002-936X,1538-7488,AmJNurs,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2009-02-27 +american journal of nursing,0002-936X,1538-7488,AmJNurs,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2009-02-27 +american journal of obstetrics and gynecology,0002-9378,1097-6868,AJOG_thegray,0,0,1,1,Obstetrics & Gynecology,NA,NA,MOSBY-ELSEVIER,2012-10-14 +american journal of occupational therapy,0272-9490,1943-7676,NA,0,1,0,0,NA,Rehabilitation,NA,"AMER OCCUPATIONAL THERAPY ASSOC, INC",NA +american journal of ophthalmology,0002-9394,1879-1891,AJOphthalmology,0,0,1,1,Ophthalmology,NA,NA,ELSEVIER SCIENCE INC,2014-07-12 +american journal of orthodontics and dentofacial orthopedics,0889-5406,1097-6752,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,MOSBY-ELSEVIER,NA +american journal of orthopsychiatry,0002-9432,1939-0025,NA,0,1,0,0,NA,Social Work,NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +american journal of otolaryngology,0196-0709,1532-818X,AmJOtol,0,0,1,1,Otorhinolaryngology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2020-11-10 +american journal of pathology,0002-9440,1525-2191,AJPathology,0,0,1,1,Pathology,NA,NA,ELSEVIER SCIENCE INC,2013-05-15 +american journal of perinatology,0735-1631,1098-8785,AmJPerinatology,0,0,1,1,Obstetrics & Gynecology | Pediatrics,NA,NA,THIEME MEDICAL PUBL INC,2014-03-31 +american journal of pharmaceutical education,0002-9459,1553-6467,NA,0,0,1,0,"Education, Scientific Disciplines | Pharmacology & Pharmacy",NA,NA,AMER ASSOC COLL PHARMACY,NA +american journal of philology,0002-9475,1086-3168,NA,1,0,0,0,NA,NA,Classics,JOHNS HOPKINS UNIV PRESS,NA +american journal of physical anthropology,0002-9483,1096-8644,NA,0,1,1,0,Evolutionary Biology,Anthropology,NA,WILEY,NA +american journal of physical anthropology,0002-9483,1096-8644,NA,0,1,1,0,Evolutionary Biology,Anthropology,NA,WILEY,NA +american journal of physical medicine & rehabilitation,0894-9115,1537-7385,NA,0,0,1,0,Rehabilitation | Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +american journal of physics,0002-9505,1943-2909,JournalPhysics,0,0,1,1,"Education, Scientific Disciplines | Physics, Multidisciplinary",NA,NA,AIP PUBLISHING,2018-09-21 +american journal of physiology-cell physiology,0363-6143,1522-1563,NA,0,0,1,0,Cell Biology | Physiology,NA,NA,AMER PHYSIOLOGICAL SOC,NA +american journal of physiology-endocrinology and metabolism,0193-1849,1522-1555,AJPEndoMetab,0,0,1,1,Endocrinology & Metabolism | Physiology,NA,NA,AMER PHYSIOLOGICAL SOC,2017-03-07 +american journal of physiology-gastrointestinal and liver physiology,0193-1857,1522-1547,NA,0,0,1,0,Gastroenterology & Hepatology | Physiology,NA,NA,AMER PHYSIOLOGICAL SOC,NA +american journal of physiology-heart and circulatory physiology,0363-6135,1522-1539,ajpheartcirc,0,0,1,1,Cardiac & Cardiovascular System | Physiology | Peripheral Vascular Diseases,NA,NA,AMER PHYSIOLOGICAL SOC,2010-07-07 +american journal of physiology-lung cellular and molecular physiology,1040-0605,1522-1504,NA,0,0,1,0,Physiology | Respiratory System,NA,NA,AMER PHYSIOLOGICAL SOC,NA +american journal of physiology-regulatory integrative and comparative physiology,0363-6119,1522-1490,AJPRegu,0,0,1,1,Physiology,NA,NA,AMER PHYSIOLOGICAL SOC,2017-09-18 +american journal of physiology-renal physiology,1931-857X,1522-1466,AJPRenalEIC,0,0,1,1,Physiology | Urology & Nephrology,NA,NA,AMER PHYSIOLOGICAL SOC,2020-06-02 +american journal of political science,0092-5853,1540-5907,AJPS_Editor,0,1,0,1,NA,Political Science,NA,WILEY,2013-01-31 +american journal of potato research,1099-209X,1874-9380,NA,0,0,1,0,Agronomy,NA,NA,SPRINGER,NA +american journal of preventive medicine,0749-3797,1873-2607,AmJPrevMed,0,1,1,1,"Public, Environmental & Occupational Health | Medicine, General & Internal","Public, Environmental & Occupational Health",NA,ELSEVIER SCIENCE INC,2012-01-13 +american journal of preventive medicine,0749-3797,1873-2607,AmJPrevMed,0,1,1,1,"Public, Environmental & Occupational Health | Medicine, General & Internal","Public, Environmental & Occupational Health",NA,ELSEVIER SCIENCE INC,2012-01-13 +american journal of primatology,0275-2565,1098-2345,AmJournalPrimat,0,0,1,1,Zoology,NA,NA,WILEY,2013-08-18 +american journal of psychiatry,0002-953X,1535-7228,AJP_ResJournal,0,1,1,1,Psychiatry,Psychiatry,NA,"AMER PSYCHIATRIC PUBLISHING, INC",2014-06-08 +american journal of psychiatry,0002-953X,1535-7228,AJP_ResJournal,0,1,1,1,Psychiatry,Psychiatry,NA,"AMER PSYCHIATRIC PUBLISHING, INC",2014-06-08 +american journal of psychology,0002-9556,1939-8298,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,UNIV ILLINOIS PRESS,NA +american journal of public health,0090-0036,1541-0048,AMJPublicHealth,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,AMER PUBLIC HEALTH ASSOC INC,2013-03-26 +american journal of public health,0090-0036,1541-0048,AMJPublicHealth,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,AMER PUBLIC HEALTH ASSOC INC,2013-03-26 +american journal of reproductive immunology,1046-7408,1600-0897,NA,0,0,1,0,Immunology | Reproductive Biology,NA,NA,WILEY,NA +american journal of respiratory and critical care medicine,1073-449X,1535-4970,ATSBlueEditor,0,0,1,1,Critical Care Medicine | Respiratory System,NA,NA,AMER THORACIC SOC,2014-12-04 +american journal of respiratory cell and molecular biology,1044-1549,1535-4989,AJRCMB,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology | Respiratory System,NA,NA,AMER THORACIC SOC,2015-03-06 +american journal of rhinology & allergy,1945-8924,1945-8932,NA,0,0,1,0,Otorhinolaryngology,NA,NA,SAGE PUBLICATIONS INC,NA +american journal of roentgenology,0361-803X,1546-3141,AJR_Radiology,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,AMER ROENTGEN RAY SOC,2020-04-14 +american journal of science,0002-9599,1945-452X,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,AMER JOURNAL SCIENCE,NA +american journal of semiotics,0277-7126,2153-2990,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",PHILOSOPHY DOCUMENTATION CENTER,NA +american journal of sociology,0002-9602,1537-5390,NA,0,1,0,0,NA,Sociology,NA,UNIV CHICAGO PRESS,NA +american journal of speech-language pathology,1058-0360,1558-9110,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,AMER SPEECH-LANGUAGE-HEARING ASSOC,NA +american journal of speech-language pathology,1058-0360,1558-9110,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,AMER SPEECH-LANGUAGE-HEARING ASSOC,NA +american journal of sports medicine,0363-5465,1552-3365,AJSM_SportsMed,0,0,1,1,Orthopedics | Sport Sciences,NA,NA,SAGE PUBLICATIONS INC,2012-11-16 +american journal of surgery,0002-9610,1879-1883,AmJSurgery,0,0,1,1,Surgery,NA,NA,EXCERPTA MEDICA INC-ELSEVIER SCIENCE INC,2015-04-02 +american journal of surgical pathology,0147-5185,1532-0979,NA,0,0,1,0,Pathology | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +american journal of the medical sciences,0002-9629,1538-2990,AmJMedSci,0,0,1,1,"Medicine, General & Internal",NA,NA,ELSEVIER SCIENCE INC,2019-06-11 +american journal of therapeutics,1075-2765,1536-3686,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +american journal of translational research,1943-8141,1943-8141,NA,0,0,1,0,"Oncology | Medicine, Research & Experimental",NA,NA,E-CENTURY PUBLISHING CORP,NA +american journal of transplantation,1600-6135,1600-6143,amjtransplant,0,0,1,1,Surgery | Transplantation,NA,NA,WILEY,2013-10-15 +american journal of tropical medicine and hygiene,0002-9637,1476-1645,AJTMH,0,0,1,1,"Public, Environmental & Occupational Health | Tropical Medicine",NA,NA,AMER SOC TROP MED & HYGIENE,2011-12-05 +american journal of veterinary research,0002-9645,1943-5681,NA,0,0,1,0,Veterinary Sciences,NA,NA,AMER VETERINARY MEDICAL ASSOC,NA +american journal on addictions,1055-0496,1521-0391,NA,0,1,0,0,NA,Substance Abuse,NA,WILEY,NA +american laboratory,0044-7749,NA,AmericanLab,0,0,1,1,"Chemistry, Analytical | Instruments & Instrumentation",NA,NA,AMER LABORATORY-LABCOMPARE,2009-04-21 +american law and economics review,1465-7252,1465-7260,NA,0,1,0,0,NA,Economics | Law,NA,OXFORD UNIV PRESS INC,NA +american literary history,0896-7148,1468-4365,AmLitHist,1,0,0,1,NA,NA,"Literature, American",OXFORD UNIV PRESS INC,2014-02-16 +american literary realism,0002-9823,2326-9235,NA,1,0,0,0,NA,NA,"Literature, American",UNIV ILLINOIS PRESS,NA +american literature,0002-9831,1527-2117,amlitjournal,1,0,0,1,NA,NA,"Literature, American",DUKE UNIV PRESS,2015-07-03 +american malacological bulletin,0740-2783,2162-2698,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,"AMER MALACOLOGICAL SOC, INC",NA +american mathematical monthly,0002-9890,1930-0972,NA,0,0,1,0,Mathematics,NA,NA,TAYLOR & FRANCIS INC,NA +american midland naturalist,0003-0031,1938-4238,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,AMER MIDLAND NATURALIST,NA +american mineralogist,0003-004X,1945-3027,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,MINERALOGICAL SOC AMER,NA +american museum novitates,0003-0082,1937-352X,NA,0,0,1,0,Biodiversity Conservation | Zoology,NA,NA,AMER MUSEUM NATURAL HISTORY,NA +american music,0734-4392,1945-2349,NA,1,0,0,0,NA,NA,Music,UNIV ILLINOIS PRESS,NA +american naturalist,0003-0147,1537-5323,ASNAmNat,0,0,1,1,Ecology | Evolutionary Biology,NA,NA,UNIV CHICAGO PRESS,2010-01-28 +american nineteenth century history,1466-4658,1743-7903,ANCHjournal,1,0,0,1,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-07-27 +american philosophical quarterly,0003-0481,2152-1123,NA,1,0,0,0,NA,NA,Philosophy,UNIV ILLINOIS PRESS,NA +american poetry review,0360-3709,2162-4984,AmPoetryReview,1,0,0,1,NA,NA,Poetry,OLD CITY PUBLISHING INC,2012-02-03 +american political science review,0003-0554,1537-5943,apsrjournal,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2019-06-11 +american politics research,1532-673X,1552-3373,apr_journal,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS INC,2015-09-13 +american psychologist,0003-066X,1935-990X,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +american quarterly,0003-0678,1080-6490,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,NA +american review of public administration,0275-0740,1552-3357,NA,0,1,0,0,NA,Public Administration,NA,SAGE PUBLICATIONS INC,NA +american scholar,0003-0937,2162-2892,TheAmScho,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",PHI BETA KAPPA SOC,2009-10-29 +american scientist,0003-0996,1545-2786,AmSciMag,0,0,1,1,Multidisciplinary Sciences,NA,NA,SIGMA XI-SCI RES SOC,2010-02-09 +american sociological review,0003-1224,1939-8271,ASR_Journal,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS INC,2015-07-03 +american speech,0003-1283,1527-2133,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DUKE UNIV PRESS,NA +american speech,0003-1283,1527-2133,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DUKE UNIV PRESS,NA +american statistician,0003-1305,1537-2731,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +american studies in scandinavia,0044-8060,0044-8060,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",ODENSE UNIV PRESS,NA +american surgeon,0003-1348,1555-9823,NA,0,0,1,0,Surgery,NA,NA,SAGE PUBLICATIONS INC,NA +americas,0003-1615,1533-6247,TAMquarterly,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2016-06-10 +americas,0003-1615,1533-6247,TAMquarterly,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2016-06-10 +amfiteatru economic,1582-9146,2247-9104,AmfiteatruEc,0,1,0,1,NA,Business | Economics | Management,NA,EDITURA ASE,2017-01-16 +amino acids,0939-4451,1438-2199,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,SPRINGER WIEN,NA +amme idaresi dergisi,1300-1795,1300-1795,NA,0,1,0,0,NA,Public Administration,NA,ANKARA HACI BAYRAM VELI UNIV,NA +amphibia-reptilia,0173-5373,1568-5381,NA,0,0,1,0,Zoology,NA,NA,BRILL,NA +amphibian & reptile conservation,1083-446X,NA,AR_Conservation,0,0,1,1,Zoology,NA,NA,AMPHIBIAN CONSERVATION RESEARCH CENTER & LAB,2014-02-10 +amyloid-journal of protein folding disorders,1350-6129,1744-2818,NA,0,0,1,0,"Biochemistry & Molecular Biology | Medicine, General & Internal | Medicine, Research & Experimental",NA,NA,TAYLOR & FRANCIS LTD,NA +amyotrophic lateral sclerosis and frontotemporal degeneration,2167-8421,2167-9223,NA,0,0,1,0,Clinical Neurology,NA,NA,TAYLOR & FRANCIS LTD,NA +anaerobe,1075-9964,1095-8274,NA,0,0,1,0,Microbiology,NA,NA,ELSEVIER SCI LTD,NA +anaesthesia,0003-2409,1365-2044,Anaes_Journal,0,0,1,1,Anesthesiology,NA,NA,WILEY,2012-07-03 +anaesthesia and intensive care,0310-057X,1448-0271,AICjournal,0,0,1,1,Anesthesiology | Critical Care Medicine,NA,NA,SAGE PUBLICATIONS LTD,2019-06-24 +anaesthesia critical care & pain medicine,2352-5568,2352-5568,AccpmJ,0,0,1,1,Anesthesiology | Critical Care Medicine,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,2020-10-01 +anaesthesist,0003-2417,1432-055X,NA,0,0,1,0,Anesthesiology,NA,NA,SPRINGER HEIDELBERG,NA +anais brasileiros de dermatologia,0365-0596,1806-4841,AnBrasDermatol,0,0,1,1,Dermatology,NA,NA,ELSEVIER SCIENCE INC,NA +anais da academia brasileira de ciencias,0001-3765,1678-2690,aabcjournal,0,0,1,1,Multidisciplinary Sciences,NA,NA,ACAD BRASILEIRA DE CIENCIAS,2018-10-15 +analele stiintifice ale universitatii ovidius constanta-seria matematica,1224-1784,1844-0835,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,OVIDIUS UNIV PRESS,NA +anales cervantinos,0569-9878,1988-8325,NA,1,0,0,0,NA,NA,"Literature, Romance",CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +anales de la literatura espanola contemporanea,0272-1635,NA,NA,1,0,0,0,NA,NA,"Literature, Romance","TEMPLE UNIV, DEPT SPANISH & PORTUGUESE",NA +anales de literatura chilena,0717-6058,0719-0913,NA,1,0,0,0,NA,NA,"Literature, Romance","PONTIFICIA UNIV CATOLICA CHILE, FAC LETRAS ,",NA +anales de pediatria,1695-4033,1696-4608,NA,0,0,1,0,Pediatrics,NA,NA,EDICIONES DOYMA S A,NA +anales de psicologia,0212-9728,1695-2294,analesps,0,1,1,1,Psychology,"Psychology, Multidisciplinary",NA,UNIV MURCIA,2017-07-31 +anales de psicologia,0212-9728,1695-2294,analesps,0,1,1,1,Psychology,"Psychology, Multidisciplinary",NA,UNIV MURCIA,2017-07-31 +anales del jardin botanico de madrid,0211-1322,1988-3196,NA,0,0,1,0,Plant Sciences,NA,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +anales del seminario de historia de la filosofia,0211-2337,1988-2564,NA,1,0,0,0,NA,NA,Philosophy,"UNIV COMPLUTENSE MADRID, SERVICIO PUBLICACIONES",NA +anales del sistema sanitario de navarra,1137-6627,1137-6627,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,GOBIERNO DE NAVARRA,NA +anales del sistema sanitario de navarra,1137-6627,1137-6627,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,GOBIERNO DE NAVARRA,NA +analog integrated circuits and signal processing,0925-1030,1573-1979,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +analyses of social issues and public policy,1529-7489,1530-2415,NA,0,1,0,0,NA,"Social Issues | Psychology, Social",NA,WILEY,NA +analysis,0003-2638,1467-8284,NA,1,0,0,0,NA,NA,Philosophy,OXFORD UNIV PRESS,NA +analysis & pde,1948-206X,NA,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,MATHEMATICAL SCIENCE PUBL,NA +analysis and applications,0219-5305,1793-6861,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +analysis and geometry in metric spaces,2299-3274,2299-3274,NA,0,0,1,0,Mathematics,NA,NA,DE GRUYTER POLAND SP Z O O,NA +analysis and mathematical physics,1664-2368,1664-235X,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +analysis mathematica,0133-3852,1588-273X,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER INT PUBL AG,NA +analyst,0003-2654,1364-5528,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,ROYAL SOC CHEMISTRY,NA +analytic methods in accident research,2213-6657,2213-6665,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Transportation",NA,ELSEVIER,NA +analytic philosophy,2153-9596,2153-960X,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +analytica chimica acta,0003-2670,1873-4324,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,ELSEVIER,NA +analytical and bioanalytical chemistry,1618-2642,1618-2650,AnalBioanalChem,0,0,1,1,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,SPRINGER HEIDELBERG,2014-01-08 +analytical and quantitative cytopathology and histopathology,0884-6812,NA,NA,0,0,1,0,Cell Biology,NA,NA,SCI PRINTERS & PUBL INC,NA +analytical biochemistry,0003-2697,1096-0309,NA,0,0,1,0,"Biochemical Research Methods | Biochemistry & Molecular Biology | Chemistry, Analytical",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +analytical cellular pathology,2210-7177,2210-7185,NA,0,0,1,0,Oncology | Cell Biology | Pathology,NA,NA,HINDAWI LTD,NA +analytical chemistry,0003-2700,1520-6882,an_chem,0,0,1,1,"Chemistry, Analytical",NA,NA,AMER CHEMICAL SOC,2012-02-10 +analytical letters,0003-2719,1532-236X,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,TAYLOR & FRANCIS INC,NA +analytical methods,1759-9660,1759-9679,MethodsRSC,0,0,1,1,"Chemistry, Analytical | Food Science & Technology | Spectroscopy",NA,NA,ROYAL SOC CHEMISTRY,2011-12-07 +analytical sciences,0910-6340,1348-2246,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,JAPAN SOC ANALYTICAL CHEMISTRY,NA +anasthesiologie & intensivmedizin,0170-5334,1439-0256,NA,0,0,1,0,Anesthesiology | Critical Care Medicine,NA,NA,AKTIV DRUCK & VERLAG GMBH,NA +anasthesiologie intensivmedizin notfallmedizin schmerztherapie,0939-2661,1439-1074,NA,0,0,1,0,Anesthesiology | Critical Care Medicine,NA,NA,GEORG THIEME VERLAG KG,NA +anatolian journal of cardiology,2149-2263,2149-2271,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,AVES,NA +anatolian studies,0066-1546,2048-0849,NA,1,0,0,0,NA,NA,History | Archaeology,CAMBRIDGE UNIV PRESS,NA +anatomia histologia embryologia,0340-2096,1439-0264,NA,0,0,1,0,Anatomy & Morphology | Veterinary Sciences,NA,NA,WILEY,NA +anatomical record-advances in integrative anatomy and evolutionary biology,1932-8486,1932-8494,AnatRecord,0,0,1,1,Anatomy & Morphology,NA,NA,WILEY,2011-12-30 +anatomical science international,1447-6959,1447-073X,NA,0,0,1,0,Anatomy & Morphology,NA,NA,SPRINGER,NA +anatomical sciences education,1935-9772,1935-9780,AnatSciEduc,0,0,1,1,"Education, Scientific Disciplines",NA,NA,WILEY,2018-05-01 +ancient mesoamerica,0956-5361,1469-1787,AMesoamerica,1,0,0,1,NA,NA,Archaeology,CAMBRIDGE UNIV PRESS,2021-02-16 +andamios,1870-0063,2594-1917,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,UNIV AUTONOMA CIUDAD MEXICO,NA +andean geology,0718-7106,0718-7106,NA,0,0,1,0,Geology,NA,NA,SERVICIO NACIONAL GEOLOGIA MINERVA,NA +andrologia,0303-4569,1439-0272,NA,0,0,1,0,Andrology,NA,NA,WILEY,NA +andrology,2047-2919,2047-2927,NA,0,0,1,0,Andrology,NA,NA,WILEY,NA +anesthesia and analgesia,0003-2999,0003-2999,IARS_Journals,0,0,1,1,Anesthesiology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2016-08-28 +anesthesiology,0003-3022,1528-1175,_Anesthesiology,0,0,1,1,Anesthesiology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-11-16 +angelaki-journal of the theoretical humanities,0969-725X,1469-2899,AngelakiH,1,0,0,1,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-07-08 +angewandte chemie-international edition,1433-7851,1521-3773,angew_chem,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,2008-09-26 +angiogenesis,0969-6970,1573-7209,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,SPRINGER,NA +angiology,0003-3197,1940-1574,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS INC,NA +angle orthodontist,0003-3219,1945-7103,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,"E H ANGLE EDUCATION RESEARCH FOUNDATION, INC",NA +anglia-zeitschrift fur englische philologie,0340-5222,1865-8938,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,WALTER DE GRUYTER GMBH,NA +animal,1751-7311,1751-732X,journal_animal,0,0,1,1,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,ELSEVIER,2019-06-11 +animal behaviour,0003-3472,1095-8282,NA,0,0,1,0,Behavioral Sciences | Zoology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +animal biodiversity and conservation,1578-665X,2014-928X,NA,0,0,1,0,Biodiversity Conservation,NA,NA,MUSEU DE CIENCIES NATURALS-ZOOLOGIA,NA +animal biology,1570-7555,1570-7563,NA,0,0,1,0,Zoology,NA,NA,BRILL,NA +animal bioscience,2765-0189,2765-0235,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,ASIAN-AUSTRALASIAN ASSOC ANIMAL PRODUCTION SOC,NA +animal biotechnology,1049-5398,1532-2378,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Biotechnology & Applied Microbiology",NA,NA,TAYLOR & FRANCIS INC,NA +animal biotelemetry,2050-3385,2050-3385,NA,0,0,1,0,Biodiversity Conservation | Marine & Freshwater Biology | Ecology,NA,NA,SPRINGERNATURE,NA +animal cells and systems,1976-8354,2151-2485,NA,0,0,1,0,Cell Biology | Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +animal cognition,1435-9448,1435-9456,NA,0,0,1,0,Behavioral Sciences | Zoology,NA,NA,SPRINGER HEIDELBERG,NA +animal conservation,1367-9430,1469-1795,AnimalConserv,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,WILEY,2012-01-24 +animal feed science and technology,0377-8401,1873-2216,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,ELSEVIER,NA +animal frontiers,2160-6056,2160-6064,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,OXFORD UNIV PRESS INC,NA +animal genetics,0268-9146,1365-2052,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Genetics & Heredity",NA,NA,WILEY,NA +animal health research reviews,1466-2523,1475-2654,NA,0,0,1,0,Veterinary Sciences,NA,NA,CAMBRIDGE UNIV PRESS,NA +animal nutrition,2405-6383,2405-6545,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,KEAI PUBLISHING LTD,NA +animal production science,1836-0939,1836-5787,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,CSIRO PUBLISHING,NA +animal reproduction,1806-9614,1984-3143,AnimalReproduc1,0,0,1,1,"Agriculture, Dairy & Animal Science",NA,NA,BRAZILIAN COLL ANIMAL REPRODUCTION,2019-01-17 +animal reproduction science,0378-4320,1873-2232,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Reproductive Biology | Veterinary Sciences",NA,NA,ELSEVIER,NA +animal science journal,1344-3941,1740-0929,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,WILEY,NA +animal science papers and reports,0860-4037,NA,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,"POLSKA AKAD NAUK, INST GENETYKI BIOTECHNOLOGII ZWIERZAT",NA +animal welfare,0962-7286,NA,NA,0,0,1,0,Veterinary Sciences | Zoology,NA,NA,UNIV FEDERATION ANIMAL WELFARE,NA +animals,2076-2615,2076-2615,Animals_MDPI,0,0,1,1,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,MDPI,2017-07-26 +animation-an interdisciplinary journal,1746-8477,1746-8485,NA,1,0,0,0,NA,NA,"Film, Radio, Television",SAGE PUBLICATIONS INC,NA +ankara universitesi veteriner fakultesi dergisi,1300-0861,1308-2817,NA,0,0,1,0,Veterinary Sciences,NA,NA,ANKARA UNIV PRESS,NA +annalen der physik,0003-3804,1521-3889,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +annales-anali za istrske in mediteranske studije-series historia et sociologia,1408-5348,2591-1775,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",HISTORICAL SOC SOUTHERN PRIMORSKA KOPER-HSSP,NA +annales academiae scientiarum fennicae-mathematica,1239-629X,1798-2383,NA,0,0,1,0,Mathematics,NA,NA,SUOMALAINEN TIEDEAKATEMIA,NA +annales botanici fennici,0003-3847,1797-2442,annbotfenn,0,0,1,1,Plant Sciences,NA,NA,FINNISH ZOOLOGICAL BOTANICAL PUBLISHING BOARD,2018-05-08 +annales d endocrinologie,0003-4266,2213-3941,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,MASSON EDITEUR,NA +annales de biologie clinique,0003-3898,1950-6112,NA,0,0,1,0,"Medical Laboratory Technology | Medicine, Research & Experimental",NA,NA,JOHN LIBBEY EUROTEXT LTD,NA +annales de bretagne et des pays de l ouest,0399-0826,2108-6443,NA,1,0,0,0,NA,NA,History,UNIV HAUTE-BRETAGNE,NA +annales de chirurgie plastique esthetique,0294-1260,1768-319X,NA,0,0,1,0,Surgery,NA,NA,ELSEVIER,NA +annales de dermatologie et de venereologie,0151-9638,2214-5451,AnnDermato,0,0,1,1,Dermatology,NA,NA,MASSON EDITEUR,2021-02-09 +annales de l institut fourier,0373-0956,1777-5310,NA,0,0,1,0,Mathematics,NA,NA,ANNALES INST FOURIER,NA +annales de l institut henri poincare-analyse non lineaire,0294-1449,1873-1430,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ELSEVIER,NA +annales de l institut henri poincare-probabilites et statistiques,0246-0203,NA,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +annales de la societe entomologique de france,0037-9271,2168-6351,NA,0,0,1,0,Entomology,NA,NA,TAYLOR & FRANCIS LTD,NA +annales de limnologie-international journal of limnology,0003-4088,2100-000X,NA,0,0,1,0,Limnology,NA,NA,EDP SCIENCES S A,NA +annales de paleontologie,0753-3969,1778-3666,NA,0,0,1,0,Paleontology,NA,NA,MASSON EDITEUR,NA +annales de pathologie,0242-6498,2213-008X,Annpathol,0,0,1,1,Pathology,NA,NA,MASSON EDITEUR,2018-03-12 +annales geophysicae,0992-7689,1432-0576,EGU_AnGeophys,0,0,1,1,"Astronomy & Astrophysics | Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,COPERNICUS GESELLSCHAFT MBH,2020-11-07 +annales henri poincare,1424-0637,1424-0661,NA,0,0,1,0,"Physics, Multidisciplinary | Physics, Particles & Fields | Physics, Mathematical",NA,NA,SPRINGER INT PUBL AG,NA +annales historiques de la revolution francaise,0003-4436,1952-403X,AhrfRevue,1,0,0,1,NA,NA,History,SOC ETUDES ROBESPIERRISTES,2021-02-05 +annales medico-psychologiques,0003-4487,1769-6631,NA,0,0,1,0,Psychiatry | Psychology,NA,NA,MASSON EDITEUR,NA +annales polonici mathematici,0066-2216,1730-6272,NA,0,0,1,0,Mathematics,NA,NA,POLISH ACAD SCIENCES INST MATHEMATICS-IMPAN,NA +annales scientifiques de l ecole normale superieure,0012-9593,1873-2151,NA,0,0,1,0,Mathematics,NA,NA,SOC MATHEMATIQUE FRANCE,NA +annales societatis geologorum poloniae,0208-9068,NA,NA,0,0,1,0,Geology,NA,NA,POLISH GEOLOGICAL SOC,NA +annales zoologici,0003-4541,1734-1833,NA,0,0,1,0,Entomology,NA,NA,MUSEUM & INST ZOOLOGY PAS-POLISH ACAD SCIENCES,NA +annales zoologici fennici,0003-455X,1797-2450,annzoolfenn,0,0,1,1,Ecology | Zoology,NA,NA,FINNISH ZOOLOGICAL BOTANICAL PUBLISHING BOARD,2018-05-08 +annali dell istituto superiore di sanita,0021-2571,2384-8553,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,PENSIERO SCIENTIFICO EDITORE,NA +annali della scuola normale superiore di pisa-classe di scienze,0391-173X,2036-2145,NA,0,0,1,0,Mathematics,NA,NA,SCUOLA NORMALE SUPERIORE,NA +annali di botanica,0365-0812,2239-3129,NA,0,0,1,0,Plant Sciences | Environmental Sciences,NA,NA,UNIV STUDI ROMA LA SAPIENZA,NA +annali di matematica pura ed applicata,0373-3114,1618-1891,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER HEIDELBERG,NA +annali italiani di chirurgia,0003-469X,2239-253X,NA,0,0,1,0,Surgery,NA,NA,EDIZIONI LUIGI POZZI,NA +annals academy of medicine singapore,0304-4602,0304-4602,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ACAD MEDICINE SINGAPORE,NA +annals of agricultural and environmental medicine,1232-1966,1898-2263,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,"INST RURAL HEALTH LUBLIN, POLAND",NA +annals of agricultural science,0570-1783,2090-8377,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,ELSEVIER,NA +annals of allergy asthma & immunology,1081-1206,1534-4436,AnnalsAllergy,0,0,1,1,Allergy | Immunology,NA,NA,ELSEVIER SCIENCE INC,2018-01-11 +annals of anatomy-anatomischer anzeiger,0940-9602,1618-0402,NA,0,0,1,0,Anatomy & Morphology,NA,NA,ELSEVIER GMBH,NA +annals of animal science,2300-8733,2300-8733,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,WALTER DE GRUYTER GMBH,NA +annals of applied biology,0003-4746,1744-7348,Annapplbiol,0,0,1,1,"Agriculture, Multidisciplinary",NA,NA,WILEY,2015-10-29 +annals of applied probability,1050-5164,NA,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +annals of applied statistics,1932-6157,1941-7330,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +annals of behavioral medicine,0883-6612,1532-4796,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,OXFORD UNIV PRESS INC,NA +annals of biomedical engineering,0090-6964,1573-9686,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,SPRINGER,NA +annals of botany,0305-7364,1095-8290,annbot,0,0,1,1,Plant Sciences,NA,NA,OXFORD UNIV PRESS,2017-09-09 +annals of cardiothoracic surgery,2225-319X,2304-1021,NA,0,0,1,0,Cardiac & Cardiovascular System | Surgery,NA,NA,AME PUBL CO,NA +annals of carnegie museum,0097-4463,1943-6300,NA,0,0,1,0,Paleontology | Zoology,NA,NA,CARNEGIE MUSEUM NATURAL HISTORY,NA +annals of clinical and laboratory science,0091-7370,1550-8080,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,ASSOC CLINICAL SCIENTISTS,NA +annals of clinical and translational neurology,2328-9503,2328-9503,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,WILEY,NA +annals of clinical biochemistry,0004-5632,1758-1001,AnnClinBiochem,0,0,1,1,Medical Laboratory Technology,NA,NA,SAGE PUBLICATIONS INC,2018-02-24 +annals of clinical microbiology and antimicrobials,1476-0711,1476-0711,NA,0,0,1,0,Microbiology,NA,NA,BMC,NA +annals of clinical psychiatry,1040-1237,1547-3325,NA,0,1,1,0,Psychiatry,Psychiatry,NA,QUADRANT HEALTHCOM INC,NA +annals of clinical psychiatry,1040-1237,1547-3325,NA,0,1,1,0,Psychiatry,Psychiatry,NA,QUADRANT HEALTHCOM INC,NA +annals of combinatorics,0218-0006,0219-3094,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER BASEL AG,NA +annals of dermatology,1013-9087,2005-3894,NA,0,0,1,0,Dermatology,NA,NA,KOREAN DERMATOLOGICAL ASSOC,NA +annals of diagnostic pathology,1092-9134,1532-8198,NA,0,0,1,0,Pathology,NA,NA,ELSEVIER SCIENCE INC,NA +annals of dyslexia,0736-9387,1934-7243,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SPRINGER,NA +annals of economics and finance,1529-7373,1529-7373,NA,0,1,0,0,NA,Economics,NA,WUHAN UNIV JOURNALS PRESS,NA +annals of emergency medicine,0196-0644,1097-6760,NA,0,0,1,0,Emergency Medicine,NA,NA,MOSBY-ELSEVIER,NA +annals of epidemiology,1047-2797,1873-2585,AnnalsOfEpi,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,ELSEVIER SCIENCE INC,2019-09-09 +annals of family medicine,1544-1709,1544-1717,AnnFamMed,0,0,1,1,"Primary Health Care | Medicine, General & Internal",NA,NA,ANNALS FAMILY MEDICINE,2011-07-12 +annals of forest research,1844-8135,2065-2445,NA,0,0,1,0,Forestry,NA,NA,EDITURA SILVICA,NA +annals of forest science,1286-4560,1297-966X,AnnForSci,0,0,1,1,Forestry,NA,NA,SPRINGER FRANCE,2014-04-25 +annals of functional analysis,2639-7390,2008-8752,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +annals of gastroenterological surgery,2475-0328,2475-0328,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,WILEY-V C H VERLAG GMBH,NA +annals of general psychiatry,1744-859X,1744-859X,NA,0,1,1,0,Psychiatry,Psychiatry,NA,BMC,NA +annals of general psychiatry,1744-859X,1744-859X,NA,0,1,1,0,Psychiatry,Psychiatry,NA,BMC,NA +annals of geophysics,1593-5213,2037-416X,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,IST NAZIONALE DI GEOFISICA E VULCANOLOGIA,NA +annals of glaciology,0260-3055,1727-5644,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,NA +annals of global analysis and geometry,0232-704X,1572-9060,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +annals of global health,2214-9996,2214-9996,AOGH_journal,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,UBIQUITY PRESS LTD,2020-10-13 +annals of hematology,0939-5555,1432-0584,NA,0,0,1,0,Hematology,NA,NA,SPRINGER,NA +annals of hepatology,1665-2681,1665-2681,AnnalsofHepatol,0,0,1,1,Gastroenterology & Hepatology,NA,NA,ELSEVIER ESPANA,2012-06-13 +annals of human biology,0301-4460,1464-5033,NA,0,1,1,0,"Biology | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Anthropology",NA,TAYLOR & FRANCIS LTD,NA +annals of human biology,0301-4460,1464-5033,NA,0,1,1,0,"Biology | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Anthropology",NA,TAYLOR & FRANCIS LTD,NA +annals of human genetics,0003-4800,1469-1809,AHGEditor,0,0,1,1,Genetics & Heredity,NA,NA,WILEY,2019-05-21 +annals of indian academy of neurology,0972-2327,1998-3549,NA,0,0,1,0,Clinical Neurology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +annals of intensive care,2110-5820,2110-5820,of_aic,0,0,1,1,Critical Care Medicine,NA,NA,SPRINGER,2021-02-22 +annals of internal medicine,0003-4819,1539-3704,AnnalsofIM,0,0,1,1,"Medicine, General & Internal",NA,NA,AMER COLL PHYSICIANS,2010-03-05 +annals of laboratory medicine,2234-3806,2234-3814,AnnLabMed,0,0,1,1,Medical Laboratory Technology,NA,NA,KOREAN SOC LABORATORY MEDICINE,2020-05-26 +annals of mathematics,0003-486X,1939-8980,NA,0,0,1,0,Mathematics,NA,NA,"ANNALS MATHEMATICS, FINE HALL",NA +annals of mathematics and artificial intelligence,1012-2443,1573-7470,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Mathematics, Applied",NA,NA,SPRINGER,NA +annals of medicine,0785-3890,1365-2060,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,TAYLOR & FRANCIS LTD,NA +annals of microbiology,1590-4261,1869-2044,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,BMC,NA +annals of neurology,0364-5134,1531-8249,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,WILEY,NA +annals of noninvasive electrocardiology,1082-720X,1542-474X,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,WILEY,NA +annals of nuclear energy,0306-4549,1873-2100,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +annals of nuclear medicine,0914-7187,1864-6433,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +annals of nutrition and metabolism,0250-6807,1421-9697,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,KARGER,NA +annals of oncology,0923-7534,1569-8041,Annals_Oncology,0,0,1,1,Oncology,NA,NA,ELSEVIER,2009-06-04 +annals of operations research,0254-5330,1572-9338,NA,0,0,1,0,Operations Research & Management Science,NA,NA,SPRINGER,NA +annals of otology rhinology and laryngology,0003-4894,1943-572X,NA,0,0,1,0,Otorhinolaryngology,NA,NA,SAGE PUBLICATIONS INC,NA +annals of palliative medicine,2224-5820,2224-5839,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,AME PUBL CO,NA +annals of pde,2524-5317,2199-2576,NA,0,0,1,0,"Mathematics | Physics, Mathematical",NA,NA,SPRINGERNATURE,NA +annals of pharmacotherapy,1060-0280,1542-6270,AnnalsofPharm,0,0,1,1,Pharmacology & Pharmacy,NA,NA,SAGE PUBLICATIONS INC,2020-04-11 +annals of pharmacotherapy,1060-0280,1542-6270,AnnalsofPharm,0,0,1,1,Pharmacology & Pharmacy,NA,NA,SAGE PUBLICATIONS INC,2009-04-15 +annals of physical and rehabilitation medicine,1877-0657,1877-0665,NA,0,0,1,0,Rehabilitation,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +annals of physics,0003-4916,1096-035X,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +annals of plastic surgery,0148-7043,1536-3708,AnnalsPlastic,0,0,1,1,Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2020-06-05 +annals of probability,0091-1798,2168-894X,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +annals of public and cooperative economics,1370-4788,1467-8292,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +annals of pure and applied logic,0168-0072,1873-2461,NA,0,0,1,0,"Mathematics, Applied | Mathematics | Logic",NA,NA,ELSEVIER,NA +annals of regional science,0570-1864,1432-0592,NA,0,1,0,0,NA,Economics | Environmental Studies | Geography | Regional & Urban Planning,NA,SPRINGER,NA +annals of saudi medicine,0256-4947,1319-9226,annsaudimed,0,0,1,1,"Medicine, General & Internal",NA,NA,K FAISAL SPEC HOSP RES CENTRE,2012-04-16 +annals of science,0003-3790,1464-505X,annals of statistics,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,TAYLOR & FRANCIS LTD,2018-08-26 +annals of science,0003-3790,1464-505X,annals of statistics,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,TAYLOR & FRANCIS LTD,2018-08-26 +annals of science,0003-3790,1464-505X,annals of statistics,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,TAYLOR & FRANCIS LTD,2018-08-26 +annals of statistics,0090-5364,2168-8966,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +annals of surgery,0003-4932,1528-1140,AnnalsofSurgery,0,0,1,1,Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-31 +annals of surgical oncology,1068-9265,1534-4681,NA,0,0,1,0,Oncology | Surgery,NA,NA,SPRINGER,NA +annals of surgical treatment and research,2288-6575,2288-6796,NA,0,0,1,0,Surgery,NA,NA,KOREAN SURGICAL SOCIETY,NA +annals of telecommunications,0003-4347,1958-9395,NA,0,0,1,0,Telecommunications,NA,NA,SPRINGER INT PUBL AG,NA +annals of the american academy of political and social science,0002-7162,1552-3349,NA,0,1,0,0,NA,"Political Science | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +annals of the american association of geographers,2469-4452,2469-4460,NA,0,1,0,0,NA,Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +annals of the american thoracic society,1546-3222,2325-6621,AnnalsATS,0,0,1,1,Respiratory System,NA,NA,AMER THORACIC SOC,2015-02-05 +annals of the entomological society of america,0013-8746,1938-2901,NA,0,0,1,0,Entomology,NA,NA,OXFORD UNIV PRESS INC,NA +annals of the institute of statistical mathematics,0020-3157,1572-9052,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER HEIDELBERG,NA +annals of the missouri botanical garden,0026-6493,2162-4372,NA,0,0,1,0,Plant Sciences,NA,NA,MISSOURI BOTANICAL GARDEN,NA +annals of the new york academy of sciences,0077-8923,1749-6632,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,WILEY,NA +annals of the rheumatic diseases,0003-4967,1468-2060,NA,0,0,1,0,Rheumatology,NA,NA,BMJ PUBLISHING GROUP,NA +annals of the royal college of surgeons of england,0035-8843,1478-7083,NA,0,0,1,0,Surgery,NA,NA,ROYAL COLL SURGEONS ENGLAND,NA +annals of thoracic and cardiovascular surgery,1341-1098,2186-1005,ATCS_journal,0,0,1,1,Cardiac & Cardiovascular System | Surgery,NA,NA,MEDICAL TRIBUNE INC,2020-01-09 +annals of thoracic medicine,1817-1737,1998-3557,NA,0,0,1,0,Cardiac & Cardiovascular System | Respiratory System,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +annals of thoracic surgery,0003-4975,1552-6259,annalsthorsurg,0,0,1,1,Cardiac & Cardiovascular System | Respiratory System | Surgery,NA,NA,ELSEVIER SCIENCE INC,2015-02-27 +annals of tourism research,0160-7383,1873-7722,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +annals of translational medicine,2305-5839,2305-5847,NA,0,0,1,0,"Oncology | Medicine, Research & Experimental",NA,NA,AME PUBL CO,NA +annals of transplantation,1425-9524,2329-0358,NA,0,0,1,0,Surgery | Transplantation,NA,NA,"INT SCIENTIFIC INFORMATION, INC",NA +annals of vascular surgery,0890-5096,1615-5947,avsgjournal,0,0,1,1,Surgery | Peripheral Vascular Diseases,NA,NA,ELSEVIER SCIENCE INC,2019-02-26 +annals of work exposures and health,2398-7308,2398-7316,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,OXFORD UNIV PRESS,NA +annee psychologique,0003-5033,1955-2580,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,PRESSES UNIV FRANCE,NA +annual of the british school at athens,0068-2454,2045-2403,NA,1,0,0,0,NA,NA,Archaeology,CAMBRIDGE UNIV PRESS,NA +annual reports in medicinal chemistry,0065-7743,0065-7743,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +annual reports on nmr spectroscopy,0066-4103,2163-6052,NA,0,0,1,0,Spectroscopy,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +annual review of analytical chemistry,1936-1327,1936-1335,NA,0,0,1,0,"Chemistry, Analytical | Spectroscopy",NA,NA,ANNUAL REVIEWS,NA +annual review of animal biosciences,2165-8102,NA,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Biotechnology & Applied Microbiology | Veterinary Sciences | Zoology",NA,NA,ANNUAL REVIEWS,NA +annual review of anthropology,0084-6570,1545-4290,NA,0,1,0,0,NA,Anthropology,NA,ANNUAL REVIEWS,NA +annual review of applied linguistics,0267-1905,1471-6356,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +annual review of applied linguistics,0267-1905,1471-6356,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +annual review of astronomy and astrophysics,0066-4146,1545-4282,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,ANNUAL REVIEWS,NA +annual review of biochemistry,0066-4154,1545-4509,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,ANNUAL REVIEWS,NA +annual review of biomedical engineering,1523-9829,1545-4274,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,ANNUAL REVIEWS,NA +annual review of biophysics,1936-122X,1936-1238,NA,0,0,1,0,Biophysics,NA,NA,ANNUAL REVIEWS,NA +annual review of cancer biology-series,2472-3428,2472-3428,NA,0,0,1,0,Oncology,NA,NA,ANNUAL REVIEWS,NA +annual review of cell and developmental biology,1081-0706,1530-8995,NA,0,0,1,0,Cell Biology | Developmental Biology,NA,NA,ANNUAL REVIEWS,NA +annual review of chemical and biomolecular engineering,1947-5438,1947-5446,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical",NA,NA,ANNUAL REVIEWS,NA +annual review of clinical psychology,1548-5943,1548-5943,NA,0,1,1,0,Psychology,"Psychology, Clinical",NA,ANNUAL REVIEWS,NA +annual review of clinical psychology,1548-5943,1548-5943,NA,0,1,1,0,Psychology,"Psychology, Clinical",NA,ANNUAL REVIEWS,NA +annual review of condensed matter physics,1947-5454,1947-5462,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,ANNUAL REVIEWS,NA +annual review of criminology,2572-4568,NA,NA,0,1,0,0,NA,Criminology & Penology,NA,ANNUAL REVIEWS,NA +annual review of earth and planetary sciences,0084-6597,1545-4495,NA,0,0,1,0,"Astronomy & Astrophysics | Geosciences, Multidisciplinary",NA,NA,ANNUAL REVIEWS,NA +annual review of ecology evolution and systematics,1543-592X,1545-2069,NA,0,0,1,0,Ecology | Evolutionary Biology,NA,NA,ANNUAL REVIEWS,NA +annual review of economics,1941-1383,1941-1391,NA,0,1,0,0,NA,Economics,NA,ANNUAL REVIEWS,NA +annual review of entomology,0066-4170,1545-4487,NA,0,0,1,0,Entomology,NA,NA,ANNUAL REVIEWS,NA +annual review of environment and resources,1543-5938,1545-2050,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,ANNUAL REVIEWS,NA +annual review of environment and resources,1543-5938,1545-2050,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,ANNUAL REVIEWS,NA +annual review of financial economics,1941-1367,1941-1375,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ANNUAL REVIEWS,NA +annual review of fluid mechanics,0066-4189,1545-4479,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,ANNUAL REVIEWS,NA +annual review of food science and technology,1941-1413,1941-1421,NA,0,0,1,0,Food Science & Technology,NA,NA,ANNUAL REVIEWS,NA +annual review of genetics,0066-4197,1545-2948,NA,0,0,1,0,Genetics & Heredity,NA,NA,ANNUAL REVIEWS,NA +annual review of genomics and human genetics,1527-8204,1545-293X,NA,0,0,1,0,Genetics & Heredity,NA,NA,ANNUAL REVIEWS,NA +annual review of immunology,0732-0582,1545-3278,NA,0,0,1,0,Immunology,NA,NA,ANNUAL REVIEWS,NA +annual review of law and social science,1550-3585,1550-3631,NA,0,1,0,0,NA,Law | Sociology,NA,ANNUAL REVIEWS,NA +annual review of linguistics,2333-9691,2333-9691,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ANNUAL REVIEWS,NA +annual review of linguistics,2333-9691,2333-9691,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ANNUAL REVIEWS,NA +annual review of marine science,1941-1405,1941-1405,NA,0,0,1,0,Geochemistry & Geophysics | Marine & Freshwater Biology | Oceanography,NA,NA,ANNUAL REVIEWS,NA +annual review of materials research,1531-7331,1545-4118,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ANNUAL REVIEWS,NA +annual review of medicine,0066-4219,1545-326X,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,ANNUAL REVIEWS,NA +annual review of microbiology,0066-4227,1545-3251,NA,0,0,1,0,Microbiology,NA,NA,ANNUAL REVIEWS,NA +annual review of neuroscience,0147-006X,1545-4126,NA,0,0,1,0,Neurosciences,NA,NA,ANNUAL REVIEWS,NA +annual review of nuclear and particle science,0163-8998,1545-4134,NA,0,0,1,0,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,ANNUAL REVIEWS,NA +annual review of nutrition,0199-9885,1545-4312,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,ANNUAL REVIEWS,NA +annual review of organizational psychology and organizational behavior,2327-0608,2327-0616,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,ANNUAL REVIEWS,NA +annual review of pathology-mechanisms of disease,1553-4006,1553-4014,NA,0,0,1,0,Pathology,NA,NA,ANNUAL REVIEWS,NA +annual review of pharmacology and toxicology,0362-1642,1545-4304,NA,0,0,1,0,Pharmacology & Pharmacy | Toxicology,NA,NA,ANNUAL REVIEWS,NA +annual review of physical chemistry,0066-426X,1545-1593,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ANNUAL REVIEWS,NA +annual review of physiology,0066-4278,1545-1585,NA,0,0,1,0,Physiology,NA,NA,ANNUAL REVIEWS,NA +annual review of phytopathology,0066-4286,1545-2107,NA,0,0,1,0,Plant Sciences,NA,NA,ANNUAL REVIEWS,NA +annual review of plant biology,1543-5008,1545-2123,NA,0,0,1,0,Plant Sciences,NA,NA,ANNUAL REVIEWS,NA +annual review of political science,1094-2939,1545-1577,NA,0,1,0,0,NA,Political Science,NA,ANNUAL REVIEWS,NA +annual review of psychology,0066-4308,1545-2085,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,ANNUAL REVIEWS,NA +annual review of psychology,0066-4308,1545-2085,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,ANNUAL REVIEWS,NA +annual review of public health,0163-7525,1545-2093,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ANNUAL REVIEWS,NA +annual review of public health,0163-7525,1545-2093,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ANNUAL REVIEWS,NA +annual review of resource economics,1941-1340,1941-1359,NA,0,1,1,0,Agricultural Economics & Policy,Economics | Environmental Studies,NA,ANNUAL REVIEWS,NA +annual review of resource economics,1941-1340,1941-1359,NA,0,1,1,0,Agricultural Economics & Policy,Economics | Environmental Studies,NA,ANNUAL REVIEWS,NA +annual review of sociology,0360-0572,1545-2115,NA,0,1,0,0,NA,Sociology,NA,ANNUAL REVIEWS,NA +annual review of statistics and its application,2326-8298,2326-831X,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,ANNUAL REVIEWS,NA +annual review of virology,2327-056X,2327-0578,NA,0,0,1,0,Virology,NA,NA,ANNUAL REVIEWS,NA +annual review of vision science,2374-4642,2374-4650,NA,0,0,1,0,Neurosciences | Ophthalmology,NA,NA,ANNUAL REVIEWS,NA +annual reviews in control,1367-5788,1872-9088,NA,0,0,1,0,Automation & Control Systems,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +anq-a quarterly journal of short articles notes and reviews,0895-769X,1940-3364,NA,1,0,0,0,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +antarctic science,0954-1020,1365-2079,Ant_Sci_Ltd,0,0,1,1,"Environmental Sciences | Geography, Physical | Geosciences, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,2015-09-12 +anthropocene,2213-3054,2213-3054,NA,0,0,1,0,"Environmental Sciences | Geography, Physical | Geosciences, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +anthropocene review,2053-0196,2053-020X,AnthropoceneRev,0,1,1,1,"Environmental Sciences | Geosciences, Multidisciplinary",Environmental Studies,NA,SAGE PUBLICATIONS INC,2013-05-28 +anthropocene review,2053-0196,2053-020X,AnthropoceneRev,0,1,1,1,"Environmental Sciences | Geosciences, Multidisciplinary",Environmental Studies,NA,SAGE PUBLICATIONS INC,2013-05-28 +anthropological forum,0066-4677,1469-2902,NA,0,1,0,0,NA,Anthropology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +anthropological notebooks,1408-032X,NA,NA,0,1,0,0,NA,Anthropology,NA,SLOVENE ANTHROPOLOGICAL SOC,NA +anthropological quarterly,0003-5491,1534-1518,AnthQuarterly,0,1,0,1,NA,Anthropology,NA,GEORGE WASHINGTON UNIV INST ETHNOGRAPHIC RESEARCH,2014-09-15 +anthropological science,0918-7960,1348-8570,NA,0,0,1,0,Evolutionary Biology,NA,NA,ANTHROPOLOGICAL SOC NIPPON,NA +anthropological theory,1463-4996,1741-2641,Anthro_Theory,0,1,0,1,NA,Anthropology,NA,SAGE PUBLICATIONS LTD,2018-11-02 +anthropologie,0003-5521,1873-5827,NA,0,1,0,0,NA,Anthropology,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +anthropologischer anzeiger,0003-5548,0003-5548,NA,0,1,0,0,NA,Anthropology,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +anthropology & education quarterly,0161-7761,1548-1492,AnthropologyEd4,0,1,0,1,NA,Anthropology | Education & Educational Research,NA,WILEY,2021-01-31 +anthropology & medicine,1364-8470,1469-2910,AnthMedJournal,0,1,0,1,NA,"Anthropology | Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-01-08 +anthropology southern africa,2332-3256,2332-3264,ASnA_Editors,0,1,0,1,NA,Anthropology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-05-29 +anthropos,0257-9774,NA,NA,0,1,0,0,NA,Anthropology,NA,NOMOS VERLAGSGESELLSCHAFT MBH & CO KG,NA +anthropozoologica,0761-3032,2107-0881,NA,1,1,0,0,NA,Anthropology,Archaeology,"PUBLICATIONS SCIENTIFIQUES DU MUSEUM, PARIS",NA +anthropozoologica,0761-3032,2107-0881,NA,1,1,0,0,NA,Anthropology,Archaeology,"PUBLICATIONS SCIENTIFIQUES DU MUSEUM, PARIS",NA +anthrozoos,0892-7936,1753-0377,AnthrozoosJ,0,1,1,1,Veterinary Sciences,Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-11-10 +anthrozoos,0892-7936,1753-0377,AnthrozoosJ,0,1,1,1,Veterinary Sciences,Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-11-10 +anti-cancer agents in medicinal chemistry,1871-5206,1875-5992,NA,0,0,1,0,"Oncology | Chemistry, Medicinal",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +anti-cancer drugs,0959-4973,1473-5741,Anti_CancerDrug,0,0,1,1,Oncology | Pharmacology & Pharmacy,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2012-08-03 +anti-corrosion methods and materials,0003-5599,1758-4221,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,EMERALD GROUP PUBLISHING LTD,NA +antibiotics-basel,2079-6382,2079-6382,antibioticsmdpi,0,0,1,1,Infectious Diseases | Pharmacology & Pharmacy,NA,NA,MDPI,2015-08-11 +anticancer research,0250-7005,1791-7530,NA,0,0,1,0,Oncology,NA,NA,INT INST ANTICANCER RESEARCH,NA +antichthon,0066-4774,2056-8819,NA,1,0,0,0,NA,NA,Classics,CAMBRIDGE UNIV PRESS,NA +antigonish review,0003-5661,0003-5661,TheAntigonish,1,0,0,1,NA,NA,Literary Reviews,ST FRANCIS XAVIER UNIV,2011-10-04 +antike und abendland,0003-5696,1613-0421,NA,1,0,0,0,NA,NA,Classics,WALTER DE GRUYTER GMBH,NA +antimicrobial agents and chemotherapy,0066-4804,1098-6596,NA,0,0,1,0,Microbiology | Pharmacology & Pharmacy,NA,NA,AMER SOC MICROBIOLOGY,NA +antimicrobial resistance and infection control,2047-2994,2047-2994,ARICJournal,0,0,1,1,"Public, Environmental & Occupational Health | Infectious Diseases | Microbiology",NA,NA,BMC,2011-07-25 +antioxidants,2076-3921,2076-3921,NA,0,0,1,0,"Chemistry, Medicinal | Biochemistry & Molecular Biology | Food Science & Technology",NA,NA,MDPI,NA +antioxidants & redox signaling,1523-0864,1557-7716,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,"MARY ANN LIEBERT, INC",NA +antipode,0066-4812,1467-8330,antipodeonline,0,1,0,1,NA,Geography,NA,WILEY,2011-06-03 +antiquaries journal,0003-5815,1758-5309,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",CAMBRIDGE UNIV PRESS,NA +antiquity,0003-598X,1745-1744,AntiquityJ,1,1,0,1,NA,Anthropology,Archaeology,CAMBRIDGE UNIV PRESS,2012-08-15 +antiquity,0003-598X,1745-1744,AntiquityJ,1,1,0,1,NA,Anthropology,Archaeology,CAMBRIDGE UNIV PRESS,2012-08-15 +antitrust law journal,0003-6056,2326-9774,NA,0,1,0,0,NA,Law,NA,"AMER BAR ASSOC, ADMINISTRATIVE LAW & REGULATORY PRACTICE SECTION",NA +antiviral research,0166-3542,1872-9096,NA,0,0,1,0,Pharmacology & Pharmacy | Virology,NA,NA,ELSEVIER,NA +antiviral therapy,1359-6535,2040-2058,NA,0,0,1,0,Infectious Diseases | Pharmacology & Pharmacy | Virology,NA,NA,INT MEDICAL PRESS LTD,NA +antonie van leeuwenhoek international journal of general and molecular microbiology,0003-6072,1572-9699,NA,0,0,1,0,Microbiology,NA,NA,SPRINGER,NA +anuario calderoniano,1888-8046,NA,acal_unav,1,0,0,1,NA,NA,"Literature, Romance",IBEROAMERICANA EDITORIAL VERVUERT S L,2019-10-21 +anuario de estudios americanos,0210-5810,1988-4273,NA,1,0,0,0,NA,NA,History,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +anuario de estudios medievales,0066-5061,1988-4230,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +anuario de historia de la iglesia,1133-0104,2174-0887,ahig_unav,1,0,0,1,NA,NA,Religion | History,"UNIV NAVARRA, SERVICIO PUBLICACIONES",2018-10-03 +anuario de psicologia juridica,1133-0740,2174-0542,AnPsiJuridica,0,1,0,1,NA,"Law | Psychology, Multidisciplinary",NA,COLEGIO OFICIAL PSICOLOGOS MADRID,2018-09-24 +anuario filosofico,0066-5215,0066-5215,NA,1,0,0,0,NA,NA,Philosophy,"UNIV NAVARRA, SERVICIO PUBLICACIONES",NA +anuario musical,0211-3538,1988-4125,NA,1,0,0,0,NA,NA,Music,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +anxiety stress and coping,1061-5806,1477-2205,NA,0,1,0,0,NA,"Psychiatry | Psychology, Multidisciplinary",NA,TAYLOR & FRANCIS LTD,NA +anz journal of surgery,1445-1433,1445-2197,NA,0,0,1,0,Surgery,NA,NA,WILEY,NA +anziam journal,1446-1811,1446-8735,NA,0,0,1,0,"Mathematics, Applied",NA,NA,CAMBRIDGE UNIV PRESS,NA +aob plants,2041-2851,2041-2851,AoBPLANTS,0,0,1,1,Plant Sciences | Ecology,NA,NA,OXFORD UNIV PRESS,NA +aorn journal,0001-2092,1878-0369,AORNJournal,0,1,1,1,Nursing,Nursing,NA,WILEY,2011-10-13 +aorn journal,0001-2092,1878-0369,AORNJournal,0,1,1,1,Nursing,Nursing,NA,WILEY,2011-10-13 +aperture,0003-6420,0003-6420,aperturefnd,1,0,0,1,NA,NA,Art,APERTURE,2009-02-03 +aphasiology,0268-7038,1464-5041,NA,0,1,1,0,Audiology & Speech-Language Pathology | Clinical Neurology | Rehabilitation,Rehabilitation | Linguistics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +aphasiology,0268-7038,1464-5041,NA,0,1,1,0,Audiology & Speech-Language Pathology | Clinical Neurology | Rehabilitation,Rehabilitation | Linguistics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +apidologie,0044-8435,1297-9678,NA,0,0,1,0,Entomology,NA,NA,SPRINGER FRANCE,NA +apl bioengineering,2473-2877,2473-2877,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,AIP PUBLISHING,NA +apl materials,2166-532X,2166-532X,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,AIP PUBLISHING,NA +apl photonics,2378-0967,2378-0967,aplphotonics,0,0,1,1,"Optics | Physics, Applied",NA,NA,AIP PUBLISHING,2020-03-27 +apmis,0903-4641,1600-0463,APMISJournal,0,0,1,1,Immunology | Microbiology | Pathology,NA,NA,WILEY,2018-01-17 +apollo-the international art magazine,0003-6536,0003-6536,Apollo_magazine,1,0,0,1,NA,NA,Art,APOLLO MAGAZINE LTD,2010-11-17 +apoptosis,1360-8185,1573-675X,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,SPRINGER,NA +appalachian journal,0090-3779,0090-3779,NA,1,0,0,0,NA,NA,History | Literary Reviews,APPALACHIAN STATE UNIV,NA +appetite,0195-6663,1095-8304,NA,0,0,1,0,Behavioral Sciences | Nutrition & Dietetics,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +applicable algebra in engineering communication and computing,0938-1279,1432-0622,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,SPRINGER,NA +applicable analysis,0003-6811,1563-504X,NA,0,0,1,0,"Mathematics, Applied",NA,NA,TAYLOR & FRANCIS LTD,NA +applicable analysis and discrete mathematics,1452-8630,2406-100X,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,"UNIV BELGRADE, FAC ELECTRICAL ENGINEERING",NA +applications in plant sciences,2168-0450,2168-0450,NA,0,0,1,0,Plant Sciences,NA,NA,WILEY,NA +applications of mathematics,0862-7940,1572-9109,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGERNATURE,NA +applied acoustics,0003-682X,1872-910X,NA,0,0,1,0,Acoustics,NA,NA,ELSEVIER SCI LTD,NA +applied and computational harmonic analysis,1063-5203,1096-603X,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +applied and computational mathematics,1683-3511,1683-6154,NA,0,0,1,0,"Mathematics, Applied",NA,NA,MINISTRY COMMUNICATIONS & HIGH TECHNOLOGIES REPUBLIC AZERBAIJAN,NA +applied and environmental microbiology,0099-2240,1098-5336,AppEnvMicro,0,0,1,1,Biotechnology & Applied Microbiology | Microbiology,NA,NA,AMER SOC MICROBIOLOGY,2015-12-15 +applied animal behaviour science,0168-1591,1872-9045,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Behavioral Sciences | Veterinary Sciences",NA,NA,ELSEVIER,NA +applied artificial intelligence,0883-9514,1087-6545,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,TAYLOR & FRANCIS INC,NA +applied biochemistry and biotechnology,0273-2289,1559-0291,NA,0,0,1,0,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology,NA,NA,SPRINGER,NA +applied biochemistry and microbiology,0003-6838,1608-3024,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,PLEIADES PUBLISHING INC,NA +applied biological chemistry,2468-0834,2468-0842,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER SINGAPORE PTE LTD,NA +applied bionics and biomechanics,1176-2322,1754-2103,NA,0,0,1,0,"Engineering, Biomedical | Robotics",NA,NA,HINDAWI LTD,NA +applied catalysis a-general,0926-860X,1873-3875,NA,0,0,1,0,"Chemistry, Physical | Environmental Sciences",NA,NA,ELSEVIER,NA +applied catalysis b-environmental,0926-3373,1873-3883,NA,0,0,1,0,"Chemistry, Physical | Engineering, Environmental | Engineering, Chemical",NA,NA,ELSEVIER,NA +applied categorical structures,0927-2852,1572-9095,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +applied clay science,0169-1317,1872-9053,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary | Mineralogy",NA,NA,ELSEVIER,NA +applied clinical informatics,1869-0327,1869-0327,NA,0,0,1,0,Medical Informatics,NA,NA,GEORG THIEME VERLAG KG,NA +applied cognitive psychology,0888-4080,1099-0720,NA,0,1,0,0,NA,"Psychology, Experimental",NA,WILEY,NA +applied composite materials,0929-189X,1573-4897,NA,0,0,1,0,"Materials Science, Composites",NA,NA,SPRINGER,NA +applied computational electromagnetics society journal,1054-4887,1943-5711,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,APPLIED COMPUTATIONAL ELECTROMAGNETICS SOC,NA +applied developmental science,1088-8691,1532-480X,AppliedDevSci,0,1,0,1,NA,"Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-07-01 +applied ecology and environmental research,1589-1623,1785-0037,NA,0,0,1,0,Ecology | Environmental Sciences,NA,NA,CORVINUS UNIV BUDAPEST,NA +applied economic analysis,2632-7627,2632-7627,AeaApplied,0,1,0,1,NA,Economics,NA,EMERALD GROUP PUBLISHING LTD,NA +applied economic perspectives and policy,2040-5790,2040-5804,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,WILEY,NA +applied economic perspectives and policy,2040-5790,2040-5804,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,WILEY,NA +applied economics,0003-6846,1466-4283,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +applied economics letters,1350-4851,1466-4291,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +applied energy,0306-2619,1872-9118,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +applied engineering in agriculture,0883-8542,1943-7838,NA,0,0,1,0,Agricultural Engineering,NA,NA,AMER SOC AGRICULTURAL & BIOLOGICAL ENGINEERS,NA +applied entomology and zoology,0003-6862,1347-605X,NA,0,0,1,0,Entomology,NA,NA,SPRINGER JAPAN KK,NA +applied ergonomics,0003-6870,1872-9126,NA,0,1,1,0,"Engineering, Industrial","Ergonomics | Psychology, Applied",NA,ELSEVIER SCI LTD,NA +applied ergonomics,0003-6870,1872-9126,NA,0,1,1,0,"Engineering, Industrial","Ergonomics | Psychology, Applied",NA,ELSEVIER SCI LTD,NA +applied geochemistry,0883-2927,1872-9134,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +applied geography,0143-6228,1873-7730,NA,0,1,0,0,NA,Geography,NA,ELSEVIER SCI LTD,NA +applied geophysics,1672-7975,1993-0658,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SPRINGER,NA +applied health economics and health policy,1175-5652,1179-1896,NA,0,1,1,0,Health Care Sciences & Services,Economics | Health Policy & Services,NA,SPRINGER INT PUBL AG,NA +applied health economics and health policy,1175-5652,1179-1896,NA,0,1,1,0,Health Care Sciences & Services,Economics | Health Policy & Services,NA,SPRINGER INT PUBL AG,NA +applied immunohistochemistry & molecular morphology,1541-2016,1533-4058,NA,0,0,1,0,Anatomy & Morphology | Medical Laboratory Technology | Pathology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +applied intelligence,0924-669X,1573-7497,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER,NA +applied linguistics,0142-6001,1477-450X,NA,0,1,0,0,NA,Linguistics,NA,OXFORD UNIV PRESS,NA +applied linguistics review,1868-6303,1868-6311,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +applied linguistics review,1868-6303,1868-6311,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +applied magnetic resonance,0937-9347,1613-7507,NA,0,0,1,0,"Physics, Atomic, Molecular & Chemical | Spectroscopy",NA,NA,SPRINGER WIEN,NA +applied materials today,2352-9407,2352-9407,applied mathematical modelling,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER,2018-08-26 +applied mathematical modelling,0307-904X,1872-8480,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications | Mechanics",NA,NA,ELSEVIER SCIENCE INC,NA +applied mathematics-a journal of chinese universities series b,1005-1031,1993-0445,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ZHEJIANG UNIV PRESS,NA +applied mathematics and computation,0096-3003,1873-5649,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ELSEVIER SCIENCE INC,NA +applied mathematics and mechanics-english edition,0253-4827,1573-2754,ApplMathMech,0,0,1,1,"Mathematics, Applied | Mechanics",NA,NA,SHANGHAI UNIV,2020-07-16 +applied mathematics and optimization,0095-4616,1432-0606,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER,NA +applied mathematics letters,0893-9659,1873-5452,NA,0,0,1,0,"Mathematics, Applied",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +applied measurement in education,0895-7347,1532-4818,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational | Psychology, Mathematical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +applied mechanics reviews,0003-6900,2379-0407,NA,0,0,1,0,Mechanics,NA,NA,ASME,NA +applied microbiology and biotechnology,0175-7598,1432-0614,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,SPRINGER,NA +applied nanoscience,2190-5509,2190-5517,NA,0,0,1,0,Nanoscience & Nanotechnology,NA,NA,SPRINGER HEIDELBERG,NA +applied neuropsychology-adult,2327-9095,2327-9109,NA,0,0,1,0,Clinical Neurology | Psychology,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +applied neuropsychology-child,2162-2965,2162-2973,NA,0,0,1,0,Clinical Neurology | Psychology,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +applied numerical mathematics,0168-9274,1873-5460,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ELSEVIER,NA +applied nursing research,0897-1897,1532-8201,NA,0,1,1,0,Nursing,Nursing,NA,W B SAUNDERS CO-ELSEVIER INC,NA +applied nursing research,0897-1897,1532-8201,NA,0,1,1,0,Nursing,Nursing,NA,W B SAUNDERS CO-ELSEVIER INC,NA +applied ocean research,0141-1187,1879-1549,NA,0,0,1,0,"Engineering, Ocean | Oceanography",NA,NA,ELSEVIER SCI LTD,NA +applied ontology,1570-5838,1875-8533,applied optics,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,IOS PRESS,2018-08-26 +applied optics,1559-128X,2155-3165,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC AMER,NA +applied organometallic chemistry,0268-2605,1099-0739,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Inorganic & Nuclear",NA,NA,WILEY,NA +applied physics a-materials science & processing,0947-8396,1432-0630,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +applied physics b-lasers and optics,0946-2171,1432-0649,NA,0,0,1,0,"Optics | Physics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +applied physics express,1882-0778,1882-0786,NA,0,0,1,0,"Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +applied physics letters,0003-6951,1077-3118,NA,0,0,1,0,"Physics, Applied",NA,NA,AIP PUBLISHING,NA +applied physics reviews,1931-9401,1931-9401,AppliedPhysRev,0,0,1,1,"Physics, Applied",NA,NA,AIP PUBLISHING,2018-09-26 +applied physiology nutrition and metabolism,1715-5312,1715-5320,NA,0,0,1,0,Nutrition & Dietetics | Physiology | Sport Sciences,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +applied psycholinguistics,0142-7164,1469-1817,NA,0,1,0,0,NA,"Linguistics | Psychology, Experimental",NA,CAMBRIDGE UNIV PRESS,NA +applied psychological measurement,0146-6216,1552-3497,NA,0,1,0,0,NA,"Social Sciences, Mathematical Methods | Psychology, Mathematical",NA,SAGE PUBLICATIONS INC,NA +applied psychology-an international review-psychologie appliquee-revue internationale,0269-994X,1464-0597,NA,0,1,0,0,NA,"Psychology, Applied",NA,WILEY,NA +applied psychology-health and well being,1758-0846,1758-0854,NA,0,1,0,0,NA,"Psychology, Applied",NA,WILEY,NA +applied psychophysiology and biofeedback,1090-0586,1573-3270,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER/PLENUM PUBLISHERS,NA +applied radiation and isotopes,0969-8043,1872-9800,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Nuclear Science & Technology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +applied research in quality of life,1871-2584,1871-2576,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SPRINGER,NA +applied rheology,1430-6395,1617-8106,NA,0,0,1,0,Mechanics,NA,NA,WALTER DE GRUYTER GMBH,NA +applied sciences-basel,2076-3417,2076-3417,Applsci,0,0,1,1,"Chemistry, Multidisciplinary | Engineering, Multidisciplinary | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,MDPI,2013-03-04 +applied soft computing,1568-4946,1872-9681,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",NA,NA,ELSEVIER,NA +applied soil ecology,0929-1393,1873-0272,NA,0,0,1,0,Soil Science,NA,NA,ELSEVIER,NA +applied spatial analysis and policy,1874-463X,1874-4621,NA,0,1,0,0,NA,Environmental Studies | Geography | Regional & Urban Planning,NA,SPRINGER,NA +applied spectroscopy,0003-7028,1943-3530,AppliedSpec,0,0,1,1,Instruments & Instrumentation | Spectroscopy,NA,NA,SAGE PUBLICATIONS INC,2013-03-06 +applied spectroscopy reviews,0570-4928,1520-569X,NA,0,0,1,0,Instruments & Instrumentation | Spectroscopy,NA,NA,TAYLOR & FRANCIS INC,NA +applied stochastic models in business and industry,1524-1904,1526-4025,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,WILEY,NA +applied surface science,0169-4332,1873-5584,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Coatings & Films | Physics, Applied | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +applied thermal engineering,1359-4311,1873-5606,Elsevier_ATE,0,0,1,1,"Thermodynamics | Energy & Fuels | Engineering, Mechanical | Mechanics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2020-05-05 +applied vegetation science,1402-2001,1654-109X,NA,0,0,1,0,Plant Sciences | Ecology | Forestry,NA,NA,WILEY,NA +applied water science,2190-5487,2190-5495,NA,0,0,1,0,Water Resources,NA,NA,SPRINGER HEIDELBERG,NA +aqua-water infrastructure ecosystems and society,2709-8028,2709-8036,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,IWA PUBLISHING,NA +aquacultural engineering,0144-8609,1873-5614,NA,0,0,1,0,Agricultural Engineering | Fisheries,NA,NA,ELSEVIER SCI LTD,NA +aquaculture,0044-8486,1873-5622,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,ELSEVIER,NA +aquaculture economics & management,1365-7305,1551-8663,NA,0,0,1,0,Agricultural Economics & Policy | Fisheries,NA,NA,TAYLOR & FRANCIS INC,NA +aquaculture environment interactions,1869-215X,1869-7534,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,INTER-RESEARCH,NA +aquaculture international,0967-6120,1573-143X,NA,0,0,1,0,Fisheries,NA,NA,SPRINGER,NA +aquaculture nutrition,1353-5773,1365-2095,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +aquaculture reports,2352-5134,2352-5134,NA,0,0,1,0,Fisheries,NA,NA,ELSEVIER,NA +aquaculture research,1355-557X,1365-2109,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +aquatic biology,1864-7790,1864-7782,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,INTER-RESEARCH,NA +aquatic botany,0304-3770,1879-1522,NA,0,0,1,0,Plant Sciences | Marine & Freshwater Biology,NA,NA,ELSEVIER,NA +aquatic conservation-marine and freshwater ecosystems,1052-7613,1099-0755,NA,0,0,1,0,Environmental Sciences | Marine & Freshwater Biology | Water Resources,NA,NA,WILEY,NA +aquatic ecology,1386-2588,1573-5125,NA,0,0,1,0,Ecology | Limnology | Marine & Freshwater Biology,NA,NA,SPRINGER,NA +aquatic ecosystem health & management,1463-4988,1539-4077,NA,0,0,1,0,Environmental Sciences | Marine & Freshwater Biology,NA,NA,MICHIGAN STATE UNIV PRESS,NA +aquatic geochemistry,1380-6165,1573-1421,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SPRINGER,NA +aquatic insects,0165-0424,1744-4152,NA,0,0,1,0,Entomology,NA,NA,TAYLOR & FRANCIS LTD,NA +aquatic invasions,1798-6540,1818-5487,NA,0,0,1,0,Ecology | Marine & Freshwater Biology,NA,NA,REGIONAL EURO-ASIAN BIOLOGICAL INVASIONS CENTRE-REABIC,NA +aquatic living resources,0990-7440,1765-2952,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,EDP SCIENCES S A,NA +aquatic mammals,0167-5427,1996-7292,AquaticMammalsJ,0,0,1,1,Marine & Freshwater Biology | Zoology,NA,NA,EUROPEAN ASSOC AQUATIC MAMMALS,2016-10-11 +aquatic microbial ecology,0948-3055,1616-1564,aquatic sciences,0,0,1,1,Ecology | Marine & Freshwater Biology | Microbiology,NA,NA,INTER-RESEARCH,2018-08-26 +aquatic sciences,1015-1621,1420-9055,NA,0,0,1,0,Environmental Sciences | Limnology | Marine & Freshwater Biology,NA,NA,SPRINGER BASEL AG,NA +aquatic toxicology,0166-445X,1879-1514,NA,0,0,1,0,Marine & Freshwater Biology | Toxicology,NA,NA,ELSEVIER,NA +arab journal of gastroenterology,1687-1979,2090-2387,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,ELSEVIER,NA +arabian archaeology and epigraphy,0905-7196,1600-0471,NA,1,0,0,0,NA,NA,Archaeology,WILEY,NA +arabian journal for science and engineering,2193-567X,2191-4281,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,SPRINGER HEIDELBERG,NA +arabian journal of chemistry,1878-5352,1878-5379,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,ELSEVIER,NA +arabian journal of geosciences,1866-7511,1866-7538,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +arabic sciences and philosophy,0957-4239,1474-0524,NA,1,0,0,0,NA,NA,History & Philosophy Of Science | Philosophy,CAMBRIDGE UNIV PRESS,NA +arabica,0570-5398,1570-0585,NA,1,0,0,0,NA,NA,History | Religion,BRILL,NA +arbor-ciencia pensamiento y cultura,0210-1963,1988-303X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +arcadia,0003-7982,1613-0642,NA,1,0,0,0,NA,NA,Literature,WALTER DE GRUYTER GMBH,NA +archaea-an international microbiological journal,1472-3646,1472-3654,NA,0,0,1,0,Microbiology,NA,NA,HINDAWI LTD,NA +archaeofauna,1132-6891,1132-6891,NA,1,0,0,0,NA,NA,Archaeology,"LABORATORIO ARQUEOZOOLOGIA, DPTO BIOLOGIA",NA +archaeological and anthropological sciences,1866-9557,1866-9565,NA,1,1,1,0,"Geosciences, Multidisciplinary",Anthropology,Archaeology,SPRINGER HEIDELBERG,NA +archaeological and anthropological sciences,1866-9557,1866-9565,NA,1,1,1,0,"Geosciences, Multidisciplinary",Anthropology,Archaeology,SPRINGER HEIDELBERG,NA +archaeological and anthropological sciences,1866-9557,1866-9565,NA,1,1,1,0,"Geosciences, Multidisciplinary",Anthropology,Archaeology,SPRINGER HEIDELBERG,NA +archaeological dialogues,1380-2038,1478-2294,NA,1,0,0,0,NA,NA,Archaeology,CAMBRIDGE UNIV PRESS,NA +archaeological prospection,1075-2196,1099-0763,ARP_eds,1,0,1,1,"Geosciences, Multidisciplinary",NA,Archaeology,WILEY,2021-10-06 +archaeological prospection,1075-2196,1099-0763,ARP_eds,1,0,1,1,"Geosciences, Multidisciplinary",NA,Archaeology,WILEY,2021-10-06 +archaeological reports-london,0570-6084,2041-4102,NA,1,0,0,0,NA,NA,Archaeology,CAMBRIDGE UNIV PRESS,NA +archaeological research in asia,2352-2267,2352-2275,NA,1,0,0,0,NA,NA,Archaeology,ELSEVIER SCI LTD,NA +archaeologies-journal of the world archaeological congress,1555-8622,1935-3987,NA,1,0,0,0,NA,NA,Archaeology,SPRINGER,NA +archaeology,0003-8113,1943-5746,NA,1,0,0,0,NA,NA,Archaeology,ARCHAEOLOGICAL INST AMERICA,NA +archaeology in oceania,0728-4896,1834-4453,in_oceania,1,1,0,1,NA,Anthropology,Archaeology,WILEY,2019-07-18 +archaeology in oceania,0728-4896,1834-4453,in_oceania,1,1,0,1,NA,Anthropology,Archaeology,WILEY,2019-07-18 +archaeometry,0003-813X,1475-4754,ArchaeometryJnl,1,0,1,1,"Chemistry, Analytical | Chemistry, Inorganic & Nuclear | Geosciences, Multidisciplinary",NA,Archaeology,WILEY,2016-03-22 +archaeometry,0003-813X,1475-4754,ArchaeometryJnl,1,0,1,1,"Chemistry, Analytical | Chemistry, Inorganic & Nuclear | Geosciences, Multidisciplinary",NA,Archaeology,WILEY,2016-03-22 +archaologisches korrespondenzblatt,0342-734X,NA,NA,1,0,0,0,NA,NA,Archaeology,ROMISCH-GERMANISCHES ZENTRALMUSEUM,NA +archeologicke rozhledy,0323-1267,2570-9151,NA,1,0,0,0,NA,NA,Archaeology,"ACAD SCIENCES CZECH REP, INST ARCHAEOLOGY",NA +archeosciences-revue d archeometrie,1960-1360,2104-3728,NA,1,0,1,0,"Chemistry, Analytical | Geosciences, Multidisciplinary",NA,Archaeology,PRESSES UNIV RENNES,NA +archeosciences-revue d archeometrie,1960-1360,2104-3728,NA,1,0,1,0,"Chemistry, Analytical | Geosciences, Multidisciplinary",NA,Archaeology,PRESSES UNIV RENNES,NA +archipel-etudes interdisciplinaires sur le monde insulindien,0044-8613,2104-3655,NA,1,0,0,0,NA,NA,Asian Studies,ASSOC ARCHIPEL,NA +architect,1935-7001,1935-7001,NA,1,0,0,0,NA,NA,Architecture,"HANLEY WOOD, LLC",NA +architectura-zeitschrift fur geschichte der baukunst,0044-863X,2569-1554,NA,1,0,0,0,NA,NA,Architecture,DEUTSCHER KUNSTVERLAG GMBH,NA +architectural design,0003-8504,1554-2769,NA,1,0,0,0,NA,NA,Architecture,"WILEY PERIODICALS, INC",NA +architectural engineering and design management,1745-2007,1752-7589,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,TAYLOR & FRANCIS LTD,NA +architectural history,0066-622X,2059-5670,NA,1,0,0,0,NA,NA,History | Architecture,CAMBRIDGE UNIV PRESS,NA +architectural record,0003-858X,NA,ArchRecord,1,0,0,1,NA,NA,Architecture,MCGRAW HILL INC,2009-01-28 +architectural review,0003-861X,NA,ArchReview,1,0,0,1,NA,NA,Architecture,EMAP BUSINESS PUBLISHING LTD,2011-03-18 +architectural science review,0003-8628,1758-9622,NA,1,0,0,0,NA,NA,Architecture,TAYLOR & FRANCIS LTD,NA +architectural theory review,1326-4826,1755-0475,Arch_Theory_Rev,1,0,0,1,NA,NA,Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-10-15 +architektura & urbanizmus,0044-8680,2729-8752,NA,1,0,0,0,NA,NA,Architecture,"INST HISTORY SLOVAK ACAD SCIENCES, DEPT ARCHITECTURE INST",NA +archiv der mathematik,0003-889X,1420-8938,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER BASEL AG,NA +archiv der pharmazie,0365-6233,1521-4184,Arch_Pharm,0,0,1,1,"Chemistry, Medicinal | Chemistry, Multidisciplinary | Pharmacology & Pharmacy",NA,NA,WILEY-V C H VERLAG GMBH,2021-08-02 +archiv fur das studium der neueren sprachen und literaturen,0003-8970,1866-5381,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,ERICH SCHMIDT VERLAG,NA +archiv fur geschichte der philosophie,0003-9101,1613-0650,NA,1,0,0,0,NA,NA,Philosophy,WALTER DE GRUYTER GMBH,NA +archiv fur molluskenkunde,1869-0963,2367-0622,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +archiv fur musikwissenschaft,0003-9292,NA,NA,1,0,0,0,NA,NA,Music,FRANZ STEINER VERLAG GMBH,NA +archiv fur papyrusforschung und verwandte gebiete,0066-6459,1867-1551,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",WALTER DE GRUYTER GMBH,NA +archiv fur reformationsgeschichte-archive for reformation history,0003-9381,2198-0489,NA,1,0,0,0,NA,NA,History,GUTERSLOHER VERLAGSHAUS,NA +archiv fur sozialgeschichte,0066-6505,NA,NA,1,0,0,0,NA,NA,History,VERLAG J H W DIETZ NACHF,NA +archiv orientalni,0044-8699,NA,ArchivOriental,1,0,0,1,NA,NA,"Asian Studies | Humanities, Multidisciplinary",ORIENTAL INST CZECH ACAD SCI,2020-11-09 +archive for history of exact sciences,0003-9519,1432-0657,NA,1,0,1,0,"History & Philosophy Of Science | Mathematics, Interdisciplinary Applications",NA,History & Philosophy Of Science,SPRINGER,NA +archive for history of exact sciences,0003-9519,1432-0657,NA,1,0,1,0,"History & Philosophy Of Science | Mathematics, Interdisciplinary Applications",NA,History & Philosophy Of Science,SPRINGER,NA +archive for mathematical logic,0933-5846,1432-0665,NA,0,0,1,0,Mathematics | Logic,NA,NA,SPRINGER HEIDELBERG,NA +archive for rational mechanics and analysis,0003-9527,1432-0673,NA,0,0,1,0,"Mathematics, Applied | Mechanics",NA,NA,SPRINGER,NA +archive for the psychology of religion-archiv fur religionspsychologie,0084-6724,1573-6121,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Religion,SAGE PUBLICATIONS LTD,NA +archive for the psychology of religion-archiv fur religionspsychologie,0084-6724,1573-6121,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Religion,SAGE PUBLICATIONS LTD,NA +archive of applied mechanics,0939-1533,1432-0681,NA,0,0,1,0,Mechanics,NA,NA,SPRINGER,NA +archives and records-the journal of the archives and records association,2325-7962,2325-7989,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +archives animal breeding,0003-9438,2363-9822,archives of acoustics,0,0,1,1,"Agriculture, Dairy & Animal Science",NA,NA,COPERNICUS GESELLSCHAFT MBH,2018-08-26 +archives de pediatrie,0929-693X,1769-664X,NA,0,0,1,0,Pediatrics,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +archives des maladies professionnelles et de l environnement,1775-8785,1778-4190,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,ELSEVIER SCIENCE INC,NA +archives europeennes de sociologie,0003-9756,1474-0583,NA,0,1,0,0,NA,Sociology,NA,CAMBRIDGE UNIV PRESS,NA +archives italiennes de biologie,0003-9829,0003-9829,NA,0,0,1,0,Neurosciences,NA,NA,PISA UNIV PRESS,NA +archives of acoustics,0137-5075,2300-262X,NA,0,0,1,0,Acoustics,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES, INST FUNDAMENTAL TECH RES PAS",NA +archives of agronomy and soil science,0365-0340,1476-3567,NA,0,0,1,0,Agronomy | Soil Science,NA,NA,TAYLOR & FRANCIS LTD,NA +archives of american art journal,0003-9853,2327-0667,NA,1,0,0,0,NA,NA,Art,UNIV CHICAGO PRESS,NA +archives of animal nutrition,1745-039X,1477-2817,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,TAYLOR & FRANCIS LTD,NA +archives of asian art,0066-6637,1944-6497,NA,1,0,0,0,NA,NA,Art | Asian Studies,DUKE UNIV PRESS,NA +archives of biochemistry and biophysics,0003-9861,1096-0384,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER SCIENCE INC,NA +archives of biological sciences,0354-4664,1821-4339,NA,0,0,1,0,Biology,NA,NA,INST BIOLOSKA ISTRAZIVANJA SINISA STANKOVIC,NA +archives of budo,1643-8698,1643-8698,NA,0,0,1,0,Sport Sciences,NA,NA,"INT SCIENTIFIC INFORMATION, INC",NA +archives of cardiovascular diseases,1875-2136,1875-2128,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",NA +archives of civil and mechanical engineering,1644-9665,2083-3318,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,SPRINGERNATURE,NA +archives of clinical neuropsychology,0887-6177,1873-5843,NA,0,1,1,0,Psychology,"Psychology, Clinical",NA,OXFORD UNIV PRESS,NA +archives of clinical neuropsychology,0887-6177,1873-5843,NA,0,1,1,0,Psychology,"Psychology, Clinical",NA,OXFORD UNIV PRESS,NA +archives of clinical psychiatry,0101-6083,1806-938X,NA,0,0,1,0,Psychiatry,NA,NA,"UNIV SAO PAULO, INST PSIQUIATRIA",NA +archives of computational methods in engineering,1134-3060,1886-1784,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER,NA +archives of control sciences,2300-2611,2300-2611,NA,0,0,1,0,"Automation & Control Systems | Mathematics, Applied",NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES",NA +archives of dermatological research,0340-3696,1432-069X,NA,0,0,1,0,Dermatology,NA,NA,SPRINGER,NA +archives of disease in childhood,0003-9888,1468-2044,ADC_BMJ,0,0,1,1,Pediatrics,NA,NA,BMJ PUBLISHING GROUP,2010-04-23 +archives of disease in childhood-education and practice edition,1743-0585,1743-0593,ArchivesEandP,0,0,1,1,Pediatrics,NA,NA,BMJ PUBLISHING GROUP,2010-01-25 +archives of disease in childhood-fetal and neonatal edition,1359-2998,1468-2052,NA,0,0,1,0,Pediatrics,NA,NA,BMJ PUBLISHING GROUP,NA +archives of endocrinology metabolism,2359-3997,2359-4292,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SBEM-SOC BRASIL ENDOCRINOLOGIA & METABOLOGIA,NA +archives of environmental & occupational health,1933-8244,2154-4700,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +archives of environmental contamination and toxicology,0090-4341,1432-0703,NA,0,0,1,0,Environmental Sciences | Toxicology,NA,NA,SPRINGER,NA +archives of environmental protection,2083-4772,2083-4810,NA,0,0,1,0,Environmental Sciences,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES, INST ENVIRON ENG PAS",NA +archives of gerontology and geriatrics,0167-4943,1872-6976,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,ELSEVIER IRELAND LTD,NA +archives of gynecology and obstetrics,0932-0067,1432-0711,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,SPRINGER HEIDELBERG,NA +archives of insect biochemistry and physiology,0739-4462,1520-6327,NA,0,0,1,0,Biochemistry & Molecular Biology | Entomology | Physiology,NA,NA,WILEY,NA +archives of iranian medicine,1029-2977,1735-3947,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ACAD MEDICAL SCIENCES I R IRAN,NA +archives of mechanics,0373-2029,0373-2029,NA,0,0,1,0,"Mechanics | Materials Science, Characterization, Testing",NA,NA,POLISH ACAD SCIENCES INST FUNDAMENTAL TECHNOLOGICAL RESEARCH,NA +archives of medical research,0188-4409,1873-5487,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,ELSEVIER SCIENCE INC,NA +archives of medical science,1734-1922,1896-9151,ArchMedSci,0,0,1,1,"Medicine, General & Internal",NA,NA,TERMEDIA PUBLISHING HOUSE LTD,2016-01-15 +archives of metallurgy and materials,1733-3490,2300-1909,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES, INST METALL & MATER SCI PAS",NA +archives of microbiology,0302-8933,1432-072X,NA,0,0,1,0,Microbiology,NA,NA,SPRINGER,NA +archives of mining sciences,0860-7001,1689-0469,NA,0,0,1,0,Mining & Mineral Processing,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES",NA +archives of natural history,0260-9541,1755-6260,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,EDINBURGH UNIV PRESS,NA +archives of natural history,0260-9541,1755-6260,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,EDINBURGH UNIV PRESS,NA +archives of natural history,0260-9541,1755-6260,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,EDINBURGH UNIV PRESS,NA +archives of oral biology,0003-9969,1879-1506,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +archives of orthopaedic and trauma surgery,0936-8051,1434-3916,NA,0,0,1,0,Orthopedics | Surgery,NA,NA,SPRINGER,NA +archives of osteoporosis,1862-3522,1862-3514,NA,0,0,1,0,Endocrinology & Metabolism | Orthopedics,NA,NA,SPRINGER LONDON LTD,NA +archives of pathology & laboratory medicine,0003-9985,1543-2165,NA,0,0,1,0,"Medical Laboratory Technology | Medicine, Research & Experimental | Pathology",NA,NA,COLL AMER PATHOLOGISTS,NA +archives of pharmacal research,0253-6269,1976-3786,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,PHARMACEUTICAL SOC KOREA,NA +archives of physical medicine and rehabilitation,0003-9993,1532-821X,NA,0,0,1,0,Rehabilitation | Sport Sciences,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +archives of physiology and biochemistry,1381-3455,1744-4160,NA,0,0,1,0,Endocrinology & Metabolism | Physiology,NA,NA,TAYLOR & FRANCIS LTD,NA +archives of psychiatric nursing,0883-9417,1532-8228,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,W B SAUNDERS CO-ELSEVIER INC,NA +archives of psychiatric nursing,0883-9417,1532-8228,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,W B SAUNDERS CO-ELSEVIER INC,NA +archives of public health,0778-7367,2049-3258,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,NA +archives of public health,0778-7367,2049-3258,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,NA +archives of rheumatology,2148-5046,1309-0283,ArchRheumatol,0,0,1,1,Rheumatology,NA,NA,TURKISH LEAGUE AGAINST RHEUMATISM,2020-12-19 +archives of sexual behavior,0004-0002,1573-2800,NA,0,1,0,0,NA,"Psychology, Clinical | Social Sciences, Interdisciplinary",NA,SPRINGER/PLENUM PUBLISHERS,NA +archives of suicide research,1381-1118,1543-6136,NA,0,1,0,0,NA,"Psychiatry | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +archives of toxicology,0340-5761,1432-0738,NA,0,0,1,0,Toxicology,NA,NA,SPRINGER HEIDELBERG,NA +archives of virology,0304-8608,1432-8798,NA,0,0,1,0,Virology,NA,NA,SPRINGER WIEN,NA +archives of womens mental health,1434-1816,1435-1102,AWMH_Journal,0,0,1,1,Psychiatry,NA,NA,SPRINGER WIEN,2017-10-20 +archivio storico italiano,0391-7770,2036-4660,NA,1,0,0,0,NA,NA,History,CASA EDITRICE LEO S OLSCHKI,NA +archivo espanol de arqueologia,0066-6742,1988-3110,NA,1,0,0,0,NA,NA,Archaeology,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +archivo espanol de arte,0004-0428,1988-8511,NA,1,0,0,0,NA,NA,Art,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +archivos argentinos de pediatria,0325-0075,1668-3501,arch_argent_ped,0,0,1,1,Pediatrics,NA,NA,SOC ARGENTINA PEDIATRIA,2010-07-21 +archivos de bronconeumologia,0300-2896,1579-2129,NA,0,0,1,0,Respiratory System,NA,NA,ELSEVIER ESPANA SLU,NA +archivos espanoles de urologia,0004-0614,1576-8260,NA,0,0,1,0,Urology & Nephrology,NA,NA,"INIESTARES, S.A.",NA +archivos latinoamericanos de nutricion,0004-0622,2309-5806,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,ARCHIVOS LATINOAMERICANOS NUTRICION,NA +archivum immunologiae et therapiae experimentalis,0004-069X,1661-4917,NA,0,0,1,0,Immunology,NA,NA,SPRINGER BASEL AG,NA +archnet-ijar international journal of architectural research,2631-6862,1938-7806,NA,1,0,0,0,NA,NA,Architecture,EMERALD GROUP PUBLISHING LTD,NA +arctic,0004-0843,1923-1245,NA,0,0,1,0,"Environmental Sciences | Geography, Physical",NA,NA,ARCTIC INST N AMER,NA +arctic antarctic and alpine research,1523-0430,1938-4246,arctic_alpine,0,0,1,1,"Environmental Sciences | Geography, Physical",NA,NA,TAYLOR & FRANCIS LTD,2010-09-28 +arctic anthropology,0066-6939,1933-8139,NA,0,1,0,0,NA,Anthropology,NA,UNIV WISCONSIN PRESS,NA +arctic science,2368-7460,2368-7460,ArcticScienceJ,0,0,1,1,Ecology | Environmental Sciences,NA,NA,CANADIAN SCIENCE PUBLISHING,2014-12-05 +ardea,0373-2266,2213-1175,ARDEA_journal,0,0,1,1,Ornithology,NA,NA,NEDERLANDSE ORNITHOLOGISCHE UNIE,2017-01-31 +ardeola-international journal of ornithology,0570-7358,2341-0825,ArdeolaJournal,0,0,1,1,Ornithology,NA,NA,SOC ESPANOLA ORNITOLGIA,2015-02-26 +area,0004-0894,1475-4762,NA,0,1,0,0,NA,Geography,NA,WILEY,NA +arethusa,0004-0975,1080-6504,NA,1,0,0,0,NA,NA,Classics,JOHNS HOPKINS UNIV PRESS,NA +argumenta oeconomica,1233-5835,1233-5835,NA,0,1,0,0,NA,Economics,NA,WROCLAW UNIV ECONOMICS,NA +argumentation,0920-427X,1572-8374,NA,1,1,0,0,NA,Communication | Linguistics,Philosophy | Language & Linguistics,SPRINGER,NA +argumentation,0920-427X,1572-8374,NA,1,1,0,0,NA,Communication | Linguistics,Philosophy | Language & Linguistics,SPRINGER,NA +arheoloski vestnik,0570-8966,0570-8966,NA,1,0,0,0,NA,NA,Archaeology,INST ARHEOLOSKI SLOVENSKA ACAD SCI ARTS,NA +arhiv za higijenu rada i toksikologiju-archives of industrial hygiene and toxicology,0004-1254,1848-6312,NA,0,0,1,0,"Public, Environmental & Occupational Health | Toxicology",NA,NA,SCIENDO,NA +arid land research and management,1532-4982,1532-4990,NA,0,0,1,0,Environmental Sciences | Soil Science,NA,NA,TAYLOR & FRANCIS INC,NA +ariel-a review of international english literature,0004-1327,1920-1222,NA,1,0,0,0,NA,NA,Literature,ARIEL UNIV CALGARY,NA +arion-a journal of humanities and the classics,0095-5809,NA,NA,1,0,0,0,NA,NA,Classics,BOSTON UNIV,NA +arkansas historical quarterly,0004-1823,2327-1213,NA,1,0,0,0,NA,NA,History,ARKANSAS HISTORICAL ASSOC,NA +arkiv for matematik,0004-2080,1871-2487,NA,0,0,1,0,Mathematics,NA,NA,"INT PRESS BOSTON, INC",NA +arkivoc,1551-7004,1551-7012,arkivoc,0,0,1,1,"Chemistry, Organic",NA,NA,ARKAT USA INC,2020-10-27 +armed forces & society,0095-327X,1556-0848,AFS_SAGE,0,1,0,1,NA,Political Science | Sociology,NA,SAGE PUBLICATIONS INC,2018-12-12 +arms & armour,1741-6124,1749-6268,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +arq,0717-6996,0717-6996,NA,1,0,0,0,NA,NA,Architecture,"PONTIFICIA UNIV CATOLICA CHILE, ESCUELA ARQUITECTURA",NA +arq-architectural research quarterly,1359-1355,1474-0516,arq_journal,1,0,0,1,NA,NA,Architecture,CAMBRIDGE UNIV PRESS,2016-08-23 +arqueologia,0327-5159,1853-8126,NA,1,0,0,0,NA,NA,Archaeology,INST ARQUEOLOGIA,NA +arquitetura revista,1808-5741,1808-5741,NA,1,0,0,0,NA,NA,Architecture,EDITORA UNISINOS,NA +arquivo brasileiro de medicina veterinaria e zootecnia,0102-0935,1678-4162,NA,0,0,1,0,Veterinary Sciences,NA,NA,ARQUIVO BRASILEIRO MEDICINA VETERINARIA ZOOTECNIA,NA +arquivos brasileiros de cardiologia,0066-782X,1678-4170,ArquivosSBC,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,ARQUIVOS BRASILEIROS CARDIOLOGIA,2015-11-04 +arquivos brasileiros de oftalmologia,0004-2749,1678-2925,NA,0,0,1,0,Ophthalmology,NA,NA,CONSEL BRASIL OFTALMOLOGIA,NA +arquivos de neuro-psiquiatria,0004-282X,1678-4227,ArqNeuroPsiq,0,0,1,1,Neurosciences | Psychiatry,NA,NA,ASSOC ARQUIVOS NEURO- PSIQUIATRIA,2020-05-19 +ars combinatoria,0381-7032,NA,NA,0,0,1,0,Mathematics,NA,NA,CHARLES BABBAGE RES CTR,NA +ars mathematica contemporanea,1855-3966,1855-3974,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,UP FAMNIT,NA +ars orientalis,0571-1371,NA,NA,1,0,0,0,NA,NA,Art | Asian Studies,"SMITHSONIAN INST, FREER GALLERY ART",NA +art bulletin,0004-3079,1559-6478,NA,1,0,0,0,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +art history,0141-6790,1467-8365,AAH_Journal,1,0,0,1,NA,NA,Art,WILEY,2017-07-06 +art in america,0004-3214,0004-3214,ArtinAmerica,1,0,0,1,NA,NA,Art,"BRANT PUBL, INC",2009-02-26 +art journal,0004-3249,2325-5307,NA,1,0,0,0,NA,NA,Art,TAYLOR & FRANCIS INC,NA +arte individuo y sociedad,1131-5598,1988-2408,IndividuoY,1,0,0,1,NA,NA,Art,"UNIV COMPLUTENSE MADRID, SERVICIO PUBLICACIONES",NA +arteriosclerosis thrombosis and vascular biology,1079-5642,1524-4636,NA,0,0,1,0,Hematology | Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +artery research,1872-9312,1876-4401,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,BMC,NA +artforum international,1086-7058,NA,NA,1,0,0,0,NA,NA,Art,ARTFORUM,NA +arthritis & rheumatology,2326-5191,2326-5205,NA,0,0,1,0,Rheumatology,NA,NA,WILEY,NA +arthritis care & research,2151-464X,2151-4658,NA,0,0,1,0,Rheumatology,NA,NA,WILEY,NA +arthritis research & therapy,1478-6354,1478-6362,ArthritisRes,0,0,1,1,Rheumatology,NA,NA,BMC,2011-11-28 +arthropod-plant interactions,1872-8855,1872-8847,NA,0,0,1,0,Entomology,NA,NA,SPRINGER,NA +arthropod structure & development,1467-8039,1873-5495,NA,0,0,1,0,Entomology,NA,NA,ELSEVIER SCI LTD,NA +arthropod systematics & phylogeny,1863-7221,1864-8312,NA,0,0,1,0,Entomology,NA,NA,"SENCKENBERG NATURHISTORISCHE SAMMLUNGEN DRESDEN, MUSEUM TIERKUNDE",NA +arthropoda selecta,0136-006X,NA,NA,0,0,1,0,Entomology,NA,NA,"KMK SCIENTIFIC PRESS LTD, MOSCOW STATE UNIV",NA +arthroscopy-the journal of arthroscopic and related surgery,0749-8063,1526-3231,ArthroscopyJ,0,0,1,1,Orthopedics | Sport Sciences | Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2012-08-05 +arthuriana,1078-6279,1934-1539,Arthuriana_Jrnl,1,0,0,1,NA,NA,"Medieval & Renaissance Studies | Literature, British Isles",SCRIPTORIUM PRESS,2015-09-28 +arti musices,0587-5455,0587-5455,NA,1,0,0,0,NA,NA,Music,CROATIAN MUSICOLOGICAL SOC,NA +artibus asiae,0004-3648,NA,NA,1,0,0,0,NA,NA,Art | Asian Studies,ARTIBUS ASIAE,NA +artibus et historiae,0391-9064,NA,NA,1,0,0,0,NA,NA,Art,IRSA PUBLISHING HOUSE,NA +artificial cells nanomedicine and biotechnology,2169-1401,2169-141X,ArtificialCell_,0,0,1,1,"Biotechnology & Applied Microbiology | Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,TAYLOR & FRANCIS LTD,2021-07-29 +artificial intelligence,0004-3702,1872-7921,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,ELSEVIER,NA +artificial intelligence and law,0924-8463,1572-8382,NA,0,1,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",Law,NA,SPRINGER,NA +artificial intelligence and law,0924-8463,1572-8382,NA,0,1,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",Law,NA,SPRINGER,NA +artificial intelligence in medicine,0933-3657,1873-2860,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Biomedical | Medical Informatics",NA,NA,ELSEVIER,NA +artificial intelligence review,0269-2821,1573-7462,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER,NA +artificial life,1064-5462,1530-9185,ARTL_journal,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,MIT PRESS,2021-01-10 +artificial organs,0160-564X,1525-1594,ArtifOrgans,0,0,1,1,"Engineering, Biomedical | Transplantation",NA,NA,WILEY,2020-08-06 +artmargins,2162-2574,2162-2582,ArtMargins,1,0,0,1,NA,NA,Art,MIT PRESS,2009-09-20 +artnews,0004-3273,2327-1221,artnews,1,0,0,1,NA,NA,Art,"BRANT PUBL, INC",2009-08-21 +arts & health,1753-3015,1753-3023,Arts_Health_Jnl,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-11-26 +arts in psychotherapy,0197-4556,1873-5878,NA,0,1,0,0,NA,"Psychology, Clinical | Rehabilitation",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +arts of asia,0004-4083,NA,artsofasia2015,1,0,0,1,NA,NA,Art | Asian Studies,ARTS ASIA PUBLICATIONS LTD,2015-03-24 +asaio journal,1058-2916,1538-943X,asaiojournal,0,0,1,1,"Engineering, Biomedical | Transplantation",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2015-06-02 +asce-asme journal of risk and uncertainty in engineering systems part a-civil engineering,2376-7642,2376-7642,NA,0,0,1,0,"Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +asclepio-revista de historia de la medicina y de la ciencia,0210-4466,1988-3102,NA,1,0,0,0,NA,NA,History & Philosophy Of Science,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +ashrae journal,0001-2491,1943-6637,ASHRAE_Journal,0,0,1,1,"Thermodynamics | Construction & Building Technology | Engineering, Mechanical",NA,NA,"AMER SOC HEATING REFRIGERATING AIR-CONDITIONING ENG, INC,",2013-01-16 +asia-pacific education researcher,0119-5646,2243-7908,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER HEIDELBERG,NA +asia-pacific journal of accounting & economics,1608-1625,2164-2257,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asia-pacific journal of atmospheric sciences,1976-7633,1976-7951,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,KOREAN METEOROLOGICAL SOC,NA +asia-pacific journal of chemical engineering,1932-2135,1932-2143,NA,0,0,1,0,"Engineering, Chemical",NA,NA,WILEY,NA +asia-pacific journal of clinical oncology,1743-7555,1743-7563,NA,0,0,1,0,Oncology,NA,NA,WILEY,NA +asia-pacific journal of financial studies,2041-9945,2041-6156,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +asia-pacific journal of oncology nursing,2347-5625,2349-6673,NA,0,1,1,0,Nursing,Nursing,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +asia-pacific journal of oncology nursing,2347-5625,2349-6673,NA,0,1,1,0,Nursing,Nursing,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +asia-pacific journal of operational research,0217-5959,1793-7019,NA,0,0,1,0,Operations Research & Management Science,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +asia-pacific journal of ophthalmology,NA,2162-0989,NA,0,0,1,0,Ophthalmology,NA,NA,ASIA-PACIFIC ACAD OPHTHALMOLOGY-APAO,NA +asia-pacific journal of public health,1010-5395,1941-2479,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +asia-pacific journal of public health,1010-5395,1941-2479,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +asia-pacific journal of teacher education,1359-866X,1469-2945,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asia-pacific psychiatry,1758-5864,1758-5872,NA,0,1,1,0,Psychiatry,Psychiatry,NA,WILEY,NA +asia-pacific psychiatry,1758-5864,1758-5872,NA,0,1,1,0,Psychiatry,Psychiatry,NA,WILEY,NA +asia & the pacific policy studies,2050-2680,2050-2680,APPSCrawford,0,1,0,1,NA,Area Studies,NA,WILEY,2021-09-09 +asia europe journal,1610-2932,1612-1031,NA,0,1,0,0,NA,International Relations,NA,SPRINGER HEIDELBERG,NA +asia pacific business review,1360-2381,1743-792X,NA,0,1,0,0,NA,Business | Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asia pacific education review,1598-1037,1876-407X,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +asia pacific journal of anthropology,1444-2213,1740-9314,NA,0,1,0,0,NA,Anthropology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asia pacific journal of clinical nutrition,0964-7058,1440-6047,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,"H E C PRESS, HEALTHY EATING CLUB PTY LTD",NA +asia pacific journal of education,0218-8791,1742-6855,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asia pacific journal of human resources,1038-4111,1744-7941,NA,0,1,0,0,NA,Industrial Relations & Labor | Management,NA,WILEY,NA +asia pacific journal of management,0217-4561,1572-9958,NA,0,1,0,0,NA,Management,NA,SPRINGER,NA +asia pacific journal of marketing and logistics,1355-5855,1758-4248,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +asia pacific journal of social work and development,0218-5385,2165-0993,NA,0,1,0,0,NA,Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asia pacific journal of tourism research,1094-1665,1741-6507,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asia pacific law review,1019-2557,1875-8444,pacific_law,0,1,0,1,NA,Law,NA,TAYLOR & FRANCIS LTD,2020-05-05 +asia pacific viewpoint,1360-7456,1467-8373,NA,0,1,0,0,NA,Area Studies | Geography,NA,WILEY,NA +asian-pacific economic literature,0818-9935,1467-8411,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +asian american journal of psychology,1948-1985,1948-1993,NA,0,1,0,0,NA,"Ethnic Studies | Psychology, Multidisciplinary",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +asian and pacific migration journal,0117-1968,2057-049X,NA,0,1,0,0,NA,Demography,NA,SAGE PUBLICATIONS LTD,NA +asian biomedicine,1905-7415,1875-855X,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,WALTER DE GRUYTER GMBH,NA +asian business & management,1472-4782,1476-9328,abmjournal,0,1,0,1,NA,Business | Management,NA,PALGRAVE MACMILLAN LTD,2020-03-08 +asian economic journal,1351-3958,1467-8381,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +asian economic papers,1535-3516,1536-0083,NA,0,1,0,0,NA,Economics,NA,MIT PRESS,NA +asian economic policy review,1832-8105,1748-3131,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +asian ethnology,1882-6865,1882-6865,AsianEthnology,1,0,0,1,NA,NA,Folklore | Asian Studies,"NANZAN UNIV, NANZAN INST RELIGION & CULTURE",2018-04-12 +asian herpetological research,2095-0357,2095-0357,NA,0,0,1,0,Zoology,NA,NA,SCIENCE PRESS,NA +asian journal of andrology,1008-682X,1745-7262,NA,0,0,1,0,Andrology | Urology & Nephrology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +asian journal of communication,0129-2986,1742-0911,AsianJComm,0,1,0,1,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-03-23 +asian journal of control,1561-8625,1934-6093,NA,0,0,1,0,Automation & Control Systems,NA,NA,WILEY,NA +asian journal of criminology,1871-0131,1871-014X,AJOCriminology,0,1,0,1,NA,Criminology & Penology,NA,SPRINGER,2021-10-30 +asian journal of mathematics,1093-6106,1945-0036,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,"INT PRESS BOSTON, INC",NA +asian journal of organic chemistry,2193-5807,2193-5815,AsianJOrgChem,0,0,1,1,"Chemistry, Organic",NA,NA,WILEY-V C H VERLAG GMBH,2012-02-16 +asian journal of pharmaceutical sciences,1818-0876,1818-0876,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SHENYANG PHARMACEUTICAL UNIV,NA +asian journal of psychiatry,1876-2018,1876-2026,NA,0,0,1,0,Psychiatry,NA,NA,ELSEVIER,NA +asian journal of social psychology,1367-2223,1467-839X,NA,0,1,0,0,NA,"Psychology, Social",NA,WILEY,NA +asian journal of social science,1568-4849,1568-5314,NA,0,1,0,0,NA,"Area Studies | Social Sciences, Interdisciplinary",NA,ELSEVIER,NA +asian journal of surgery,1015-9584,0219-3108,NA,0,0,1,0,Surgery,NA,NA,ELSEVIER SINGAPORE PTE LTD,NA +asian journal of technology innovation,1976-1597,2158-6721,NA,0,1,0,0,NA,Business | Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asian journal of womens studies,1225-9276,2377-004X,ajws_ewha,0,1,0,1,NA,Women'S Studies,NA,TAYLOR & FRANCIS LTD,2020-10-02 +asian journal of wto & international health law and policy,1819-5164,NA,NA,0,1,0,0,NA,Health Policy & Services | International Relations | Law,NA,"NATL TAIWAN UNIV PRESS",NA +asian music,0044-9202,1553-5630,NA,1,0,0,0,NA,NA,Music | Asian Studies,UNIV TEXAS PRESS,NA +asian myrmecology,1985-1944,NA,AsianMyrmecol,0,0,1,1,Entomology,NA,NA,UNIV MALAYSIA SABAH,2020-07-17 +asian nursing research,1976-1317,2093-7482,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +asian nursing research,1976-1317,2093-7482,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +asian pacific journal of allergy and immunology,0125-877X,2228-8694,NA,0,0,1,0,Allergy | Immunology,NA,NA,ALLERGY IMMUNOL SOC THAILAND,NA +asian pacific journal of tropical biomedicine,2221-1691,2588-9222,NA,0,0,1,0,Tropical Medicine,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +asian pacific journal of tropical medicine,1995-7645,2352-4146,NA,0,0,1,0,"Public, Environmental & Occupational Health | Tropical Medicine",NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +asian perspective,0258-9184,0258-9184,NA,0,1,0,0,NA,International Relations,NA,"KYUNGNAM UNIV, INST FAR EASTERN STUDIES",NA +asian perspectives-the journal of archaeology for asia and the pacific,0066-8435,1535-8283,NA,1,0,0,0,NA,NA,Archaeology,UNIV HAWAII PRESS,NA +asian philosophy,0955-2367,1469-2961,NA,1,0,0,0,NA,NA,Philosophy | Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asian population studies,1744-1730,1744-1749,NA,0,1,0,0,NA,Demography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +asian studies review,1035-7823,1467-8403,AsianStudiesRev,1,1,0,1,NA,Cultural Studies | Area Studies,Cultural Studies | Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-12-19 +asian studies review,1035-7823,1467-8403,AsianStudiesRev,1,1,0,1,NA,Cultural Studies | Area Studies,Cultural Studies | Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-12-19 +asian survey,0004-4687,1533-838X,AsianSurvey,0,1,0,1,NA,Area Studies,NA,UNIV CALIFORNIA PRESS,2014-04-14 +asian theatre journal,0742-5457,1527-2109,NA,1,0,0,0,NA,NA,Theater | Asian Studies,UNIV HAWAII PRESS,NA +asian women,1225-925X,2586-5714,NA,0,1,0,0,NA,Women'S Studies,NA,SOOKMYUNG WOMENS UNIV,NA +aslib journal of information management,2050-3806,1758-3748,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +aslib journal of information management,2050-3806,1758-3748,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +asn neuro,1759-0914,1759-0914,ASNNEURO,0,0,1,1,Neurosciences,NA,NA,SAGE PUBLICATIONS LTD,2012-06-19 +assay and drug development technologies,1540-658X,1557-8127,NA,0,0,1,0,Biochemical Research Methods | Pharmacology & Pharmacy,NA,NA,"MARY ANN LIEBERT, INC",NA +assembly automation,0144-5154,1758-4078,NA,0,0,1,0,"Automation & Control Systems | Engineering, Manufacturing",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +assessing writing,1075-2935,1873-5916,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,ELSEVIER SCI LTD,NA +assessment,1073-1911,1552-3489,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SAGE PUBLICATIONS INC,NA +assessment & evaluation in higher education,0260-2938,1469-297X,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +assessment in education-principles policy & practice,0969-594X,1465-329X,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +assistenza infermieristica e ricerca,1592-5986,2038-1778,NA,0,1,1,0,Nursing,Nursing,NA,PENSIERO SCIENTIFICO EDITORE,NA +assistenza infermieristica e ricerca,1592-5986,2038-1778,NA,0,1,1,0,Nursing,Nursing,NA,PENSIERO SCIENTIFICO EDITORE,NA +assistive technology,1040-0435,1949-3614,RESNAATJournal,0,1,0,1,NA,Rehabilitation,NA,TAYLOR & FRANCIS INC,2021-05-06 +asta-advances in statistical analysis,1863-8171,1863-818X,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER,NA +asterisque,0303-1179,2492-5926,NA,0,0,1,0,Mathematics,NA,NA,SOC MATHEMATIQUE FRANCE,NA +astin bulletin,0515-0361,1783-1350,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,CAMBRIDGE UNIV PRESS,NA +astin bulletin,0515-0361,1783-1350,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,CAMBRIDGE UNIV PRESS,NA +astrobiology,1531-1074,1557-8070,Astrobiology_jn,0,0,1,1,"Astronomy & Astrophysics | Biology | Geosciences, Multidisciplinary",NA,NA,"MARY ANN LIEBERT, INC",2010-09-30 +astronomical journal,0004-6256,1538-3881,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,IOP PUBLISHING LTD,NA +astronomische nachrichten,0004-6337,1521-3994,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,WILEY-V C H VERLAG GMBH,NA +astronomy & astrophysics,0004-6361,1432-0746,AandA_journal,0,0,1,1,Astronomy & Astrophysics,NA,NA,EDP SCIENCES S A,2015-01-16 +astronomy & geophysics,1366-8781,1468-4004,NA,0,0,1,0,Astronomy & Astrophysics | Geochemistry & Geophysics,NA,NA,OXFORD UNIV PRESS,NA +astronomy and astrophysics review,0935-4956,1432-0754,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,SPRINGER,NA +astronomy and computing,2213-1337,2213-1345,NA,0,0,1,0,"Astronomy & Astrophysics | Computer Science, Interdisciplinary Applications",NA,NA,ELSEVIER,NA +astronomy letters-a journal of astronomy and space astrophysics,1063-7737,1562-6873,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,PLEIADES PUBLISHING INC,NA +astronomy reports,1063-7729,1562-6881,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,PLEIADES PUBLISHING INC,NA +astroparticle physics,0927-6505,1873-2852,NA,0,0,1,0,"Astronomy & Astrophysics | Physics, Particles & Fields",NA,NA,ELSEVIER,NA +astrophysical bulletin,1990-3413,1990-3421,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +astrophysical journal,0004-637X,1538-4357,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,IOP PUBLISHING LTD,NA +astrophysical journal letters,2041-8205,2041-8213,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,IOP PUBLISHING LTD,NA +astrophysical journal supplement series,0067-0049,1538-4365,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,IOP PUBLISHING LTD,NA +astrophysics,0571-7256,1573-8191,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +astrophysics and space science,0004-640X,1572-946X,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,SPRINGER,NA +asymptotic analysis,0921-7134,1875-8576,NA,0,0,1,0,"Mathematics, Applied",NA,NA,IOS PRESS,NA +at-automatisierungstechnik,0178-2312,0178-2312,NA,0,0,1,0,Automation & Control Systems,NA,NA,WALTER DE GRUYTER GMBH,NA +atalante-revista de estudios cinematograficos,1885-3730,2340-6992,RevistaAtalante,1,0,0,1,NA,NA,"Film, Radio, Television",ASOC CINEFORUM L ATALANTE,2016-10-19 +atencion primaria,0212-6567,1578-1275,NA,0,0,1,0,"Primary Health Care | Medicine, General & Internal",NA,NA,EDICIONES DOYMA S A,NA +atenea,0718-0462,0718-0462,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","UNIV CONCEPCION, BIBLIOTECA CENTRAL",NA +athenaeum-studi periodici di letteratura e storia dell antichita,0004-6574,0004-6574,NA,1,0,0,0,NA,NA,Classics,NEW PRESS SNC,NA +atherosclerosis,0021-9150,1879-1484,ATHjournal,0,0,1,1,Cardiac & Cardiovascular System | Peripheral Vascular Diseases,NA,NA,ELSEVIER IRELAND LTD,2019-03-19 +atherosclerosis supplements,1567-5688,1878-5050,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,ELSEVIER IRELAND LTD,NA +atla-alternatives to laboratory animals,0261-1929,2632-3559,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,SAGE PUBLICATIONS LTD,NA +atlantic geology,0843-5561,1718-7885,NA,0,0,1,0,Geology,NA,NA,ATLANTIC GEOSCIENCE SOC,NA +atlantis-journal of the spanish association of anglo-american studies,0210-6124,1989-6840,NA,1,1,0,0,NA,Linguistics,Literature | Language & Linguistics,ASOC ESPANOLA ESTUDIOS ANGLO-NORTEAMERICANOS-AEDEAN,NA +atlantis-journal of the spanish association of anglo-american studies,0210-6124,1989-6840,NA,1,1,0,0,NA,Linguistics,Literature | Language & Linguistics,ASOC ESPANOLA ESTUDIOS ANGLO-NORTEAMERICANOS-AEDEAN,NA +atmosfera,0187-6236,2395-8812,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,CENTRO CIENCIAS ATMOSFERA UNAM,NA +atmosphere,2073-4433,2073-4433,Atmosphere_MDPI,0,0,1,1,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,MDPI,2015-10-20 +atmosphere-ocean,0705-5900,1480-9214,NA,0,0,1,0,Meteorology & Atmospheric Sciences | Oceanography,NA,NA,TAYLOR & FRANCIS LTD,NA +atmospheric chemistry and physics,1680-7316,1680-7324,EGU_ACP,0,0,1,1,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-10 +atmospheric environment,1352-2310,1873-2844,NA,0,0,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +atmospheric measurement techniques,1867-1381,1867-8548,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,COPERNICUS GESELLSCHAFT MBH,NA +atmospheric pollution research,1309-1042,1309-1042,NA,0,0,1,0,Environmental Sciences,NA,NA,TURKISH NATL COMMITTEE AIR POLLUTION RES & CONTROL-TUNCAP,NA +atmospheric research,0169-8095,1873-2895,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,ELSEVIER SCIENCE INC,NA +atmospheric science letters,1530-261X,1530-261X,IAP_AOSL,0,0,1,1,Meteorology & Atmospheric Sciences | Geochemistry & Geophysics,NA,NA,WILEY,2014-04-11 +atomic data and nuclear data tables,0092-640X,1090-2090,NA,0,0,1,0,"Physics, Atomic, Molecular & Chemical | Physics, Nuclear",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +atomic energy,1063-4258,1573-8205,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,SPRINGER,NA +atomic spectroscopy,0195-5373,2708-521X,NA,0,0,1,0,Spectroscopy,NA,NA,ATOMIC SPECTROSCOPY PRESS LTD,NA +atomization and sprays,1044-5110,1936-2684,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Chemical | Engineering, Mechanical | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,BEGELL HOUSE INC,NA +attachment & human development,1461-6734,1469-2988,NA,0,1,0,0,NA,"Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +attention perception & psychophysics,1943-3921,1943-393X,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,SPRINGER,NA +attention perception & psychophysics,1943-3921,1943-393X,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,SPRINGER,NA +atw-international journal for nuclear power,1431-5254,NA,atw_Journal,0,0,1,1,Nuclear Science & Technology,NA,NA,INFORUM VERLAGS-VERWALTUNGSGESELLSCHAFT MBH,2020-06-29 +audiology and neuro-otology,1420-3030,1421-9700,NA,0,0,1,0,Audiology & Speech-Language Pathology | Neurosciences | Otorhinolaryngology,NA,NA,KARGER,NA +auditing-a journal of practice & theory,0278-0380,1558-7991,NA,0,1,0,0,NA,"Business, Finance",NA,AMER ACCOUNTING ASSOC,NA +augmentative and alternative communication,0743-4618,1477-3848,NA,0,1,1,0,Audiology & Speech-Language Pathology,Rehabilitation,NA,TAYLOR & FRANCIS LTD,NA +augmentative and alternative communication,0743-4618,1477-3848,NA,0,1,1,0,Audiology & Speech-Language Pathology,Rehabilitation,NA,TAYLOR & FRANCIS LTD,NA +augustinian studies,0094-5323,2153-7917,NA,1,0,0,0,NA,NA,Philosophy | Religion | History,PHILOSOPHY DOCUMENTATION CENTER,NA +aula orientalis,0212-5730,0212-5730,NA,1,0,0,0,NA,NA,Asian Studies | Archaeology,"UNIV BARCELONA, INST UNIV PROXIM ORIENT ANTIC",NA +auris nasus larynx,0385-8146,1879-1476,NA,0,0,1,0,Otorhinolaryngology,NA,NA,ELSEVIER SCI LTD,NA +austral ecology,1442-9985,1442-9993,AustralEcology,0,0,1,1,Ecology,NA,NA,WILEY,2017-04-12 +austral entomology,2052-1758,2052-174X,NA,0,0,1,0,Entomology,NA,NA,WILEY,NA +austral journal of veterinary sciences,0719-8000,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,"UNIV AUSTRAL CHILE, FAC CIENCIAS VETERINARIAS",NA +australasian drama studies,0810-4123,NA,NA,1,0,0,0,NA,NA,Theater,AUSTRALASIAN ASSOC THEATRE DRAMA & PERFORMANCE STUDIES,NA +australasian emergency care,2588-994X,2588-994X,AusEmergCare,0,1,1,1,Emergency Medicine | Nursing,Nursing,NA,ELSEVIER SCI LTD,2015-10-05 +australasian emergency care,2588-994X,2588-994X,AusEmergCare,0,1,1,1,Emergency Medicine | Nursing,Nursing,NA,ELSEVIER SCI LTD,2015-10-05 +australasian journal of dermatology,0004-8380,1440-0960,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +australasian journal of early childhood,1836-9391,1839-5961,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS LTD,NA +australasian journal of educational technology,1449-3098,1449-5554,AJET_eds,0,1,0,1,NA,Education & Educational Research,NA,AUSTRALASIAN SOC COMPUTERS LEARNING TERTIARY EDUCATION-ASCILITE,2017-12-01 +australasian journal of environmental management,1448-6563,2159-5356,NA,0,1,0,0,NA,Environmental Studies,NA,TAYLOR & FRANCIS LTD,NA +australasian journal of philosophy,0004-8402,1471-6828,AustralJPhilos,1,0,0,1,NA,NA,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-03-29 +australasian journal on ageing,1440-6381,1741-6612,AgeingJ,0,1,1,1,Geriatrics & Gerontology,Gerontology,NA,WILEY,2019-11-05 +australasian journal on ageing,1440-6381,1741-6612,AgeingJ,0,1,1,1,Geriatrics & Gerontology,Gerontology,NA,WILEY,2019-11-05 +australasian orthodontic journal,2207-7472,2207-7480,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,EXELEY INC,NA +australasian plant pathology,0815-3191,1448-6032,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +australasian psychiatry,1039-8562,1440-1665,AP_RANZCP,0,1,1,1,Psychiatry,Psychiatry,NA,SAGE PUBLICATIONS LTD,2021-12-10 +australasian psychiatry,1039-8562,1440-1665,AP_RANZCP,0,1,1,1,Psychiatry,Psychiatry,NA,SAGE PUBLICATIONS LTD,2021-12-10 +australian & new zealand journal of obstetrics & gynaecology,0004-8666,1479-828X,anzjog,0,0,1,1,Obstetrics & Gynecology,NA,NA,WILEY,2018-02-08 +australian & new zealand journal of statistics,1369-1473,1467-842X,NA,0,0,1,0,Statistics & Probability,NA,NA,WILEY,NA +australian aboriginal studies,0729-4352,NA,NA,0,1,0,0,NA,Anthropology,NA,ABORIGINAL STUDIES PRESS,NA +australian accounting review,1035-6908,1835-2561,AustAcctgReview,0,1,0,1,NA,"Business, Finance",NA,WILEY,2019-04-18 +australian and new zealand journal of family therapy,0814-723X,1467-8438,NA,0,1,0,0,NA,Family Studies,NA,WILEY,NA +australian and new zealand journal of psychiatry,0004-8674,1440-1614,NA,0,1,1,0,Psychiatry,Psychiatry,NA,SAGE PUBLICATIONS LTD,NA +australian and new zealand journal of psychiatry,0004-8674,1440-1614,NA,0,1,1,0,Psychiatry,Psychiatry,NA,SAGE PUBLICATIONS LTD,NA +australian and new zealand journal of public health,1326-0200,1753-6405,anzjph,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,WILEY,2015-06-18 +australian and new zealand journal of public health,1326-0200,1753-6405,anzjph,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,WILEY,2015-06-18 +australian archaeology,0312-2417,2470-0363,AustArchJ,1,1,0,1,NA,Anthropology,Archaeology,TAYLOR & FRANCIS LTD,2020-01-28 +australian archaeology,0312-2417,2470-0363,AustArchJ,1,1,0,1,NA,Anthropology,Archaeology,TAYLOR & FRANCIS LTD,2020-01-28 +australian critical care,1036-7314,1878-1721,Aus_CC,0,1,1,1,Critical Care Medicine | Nursing,Nursing,NA,ELSEVIER SCIENCE INC,2015-05-30 +australian critical care,1036-7314,1878-1721,Aus_CC,0,1,1,1,Critical Care Medicine | Nursing,Nursing,NA,ELSEVIER SCIENCE INC,2015-05-30 +australian dental journal,0045-0421,1834-7819,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +australian economic history review,0004-8992,1467-8446,EcoHistoryAU,0,1,0,1,NA,Economics | History Of Social Sciences,NA,WILEY,2018-08-01 +australian economic papers,0004-900X,1467-8454,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +australian economic review,0004-9018,1467-8462,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +australian educational researcher,0311-6999,2210-5328,AER_AARE,0,1,0,1,NA,Education & Educational Research,NA,SPRINGER,2014-02-20 +australian endodontic journal,1329-1947,1747-4477,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +australian feminist studies,0816-4649,1465-3303,NA,0,1,0,0,NA,Women'S Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +australian forestry,0004-9158,2325-6087,NA,0,0,1,0,Forestry,NA,NA,TAYLOR & FRANCIS AUSTRALASIA,NA +australian geographer,0004-9182,1465-3311,austgeog,0,1,0,1,NA,Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-02-19 +australian health review,0156-5788,1449-8944,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,CSIRO PUBLISHING,NA +australian health review,0156-5788,1449-8944,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,CSIRO PUBLISHING,NA +australian historical studies,1031-461X,1940-5049,AHSjournal,1,0,0,1,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-07-23 +australian journal of adult learning,1443-1394,NA,journal_ajal,0,1,0,1,NA,Education & Educational Research,NA,ADULT LEARNING AUSTRALIA INC,2021-03-05 +australian journal of advanced nursing,0813-0531,1447-4328,NA,0,1,1,0,Nursing,Nursing,NA,AUSTRALIAN NURSING FEDERATION,NA +australian journal of advanced nursing,0813-0531,1447-4328,NA,0,1,1,0,Nursing,Nursing,NA,AUSTRALIAN NURSING FEDERATION,NA +australian journal of agricultural and resource economics,1364-985X,1467-8489,AJAREJournal,0,1,1,1,Agricultural Economics & Policy,Economics,NA,WILEY,2021-07-09 +australian journal of agricultural and resource economics,1364-985X,1467-8489,AJAREJournal,0,1,1,1,Agricultural Economics & Policy,Economics,NA,WILEY,2021-07-09 +australian journal of anthropology,1035-8811,1757-6547,NA,0,1,0,0,NA,Anthropology,NA,WILEY,NA +australian journal of botany,0067-1924,1444-9862,NA,0,0,1,0,Plant Sciences,NA,NA,CSIRO PUBLISHING,NA +australian journal of chemistry,0004-9425,1445-0038,AusJChem,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,CSIRO PUBLISHING,2021-01-21 +australian journal of earth sciences,0812-0099,1440-0952,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +australian journal of education,0004-9441,2050-5884,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS LTD,NA +australian journal of forensic sciences,0045-0618,1834-562X,NA,0,0,1,0,"Medicine, Legal",NA,NA,TAYLOR & FRANCIS LTD,NA +australian journal of french studies,0004-9468,2046-2913,NA,1,0,0,0,NA,NA,"Literature, Romance",LIVERPOOL UNIV PRESS,NA +australian journal of general practice,2208-794X,2208-7958,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ROYAL AUSTRALIAN COLLEGE GENERAL PRACTITIONERS,NA +australian journal of grape and wine research,1322-7130,1755-0238,JournalGrape,0,0,1,1,Food Science & Technology | Horticulture,NA,NA,WILEY,2018-09-07 +australian journal of international affairs,1035-7718,1465-332X,AustJIA,0,1,0,1,NA,International Relations,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-10-21 +australian journal of linguistics,0726-8602,1469-2996,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +australian journal of linguistics,0726-8602,1469-2996,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +australian journal of management,0312-8962,1327-2020,NA,0,1,0,0,NA,Business | Management,NA,SAGE PUBLICATIONS LTD,NA +australian journal of political science,1036-1146,1363-030X,ausjpolsci,0,1,0,1,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-07-03 +australian journal of politics and history,0004-9522,1467-8497,ajpandh,1,1,0,1,NA,History | Political Science,History,WILEY,2015-02-06 +australian journal of politics and history,0004-9522,1467-8497,ajpandh,1,1,0,1,NA,History | Political Science,History,WILEY,2015-02-06 +australian journal of primary health,1448-7527,1836-7399,AusJPrimHealth,0,1,1,1,"Health Care Sciences & Services | Primary Health Care | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,CSIRO PUBLISHING,2017-04-06 +australian journal of primary health,1448-7527,1836-7399,AusJPrimHealth,0,1,1,1,"Health Care Sciences & Services | Primary Health Care | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,CSIRO PUBLISHING,2017-04-06 +australian journal of psychology,0004-9530,1742-9536,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,TAYLOR & FRANCIS LTD,NA +australian journal of public administration,0313-6647,1467-8500,AusJPA,0,1,0,1,NA,Public Administration,NA,WILEY,2013-08-23 +australian journal of rural health,1038-5282,1440-1584,AusJRuralHealth,0,1,1,1,"Public, Environmental & Occupational Health | Nursing","Public, Environmental & Occupational Health | Nursing",NA,WILEY,2020-02-20 +australian journal of rural health,1038-5282,1440-1584,AusJRuralHealth,0,1,1,1,"Public, Environmental & Occupational Health | Nursing","Public, Environmental & Occupational Health | Nursing",NA,WILEY,2020-02-20 +australian journal of social issues,0157-6321,1839-4655,AusSocialIssues,0,1,0,1,NA,Social Issues,NA,WILEY,2018-05-14 +australian journal of zoology,0004-959X,1446-5698,NA,0,0,1,0,Zoology,NA,NA,CSIRO PUBLISHING,NA +australian literary studies,0004-9697,1837-6479,ALSjournal,1,0,0,1,NA,NA,"Literature, African, Australian, Canadian",UNIV QUEENSLAND AUSTRALIAN LITERARY STUDIES,2015-11-24 +australian mammalogy,0310-0049,1836-7402,NA,0,0,1,0,Zoology,NA,NA,CSIRO PUBLISHING,NA +australian occupational therapy journal,0045-0766,1440-1630,AusOTJournal,0,0,1,1,Rehabilitation,NA,NA,WILEY,2018-01-29 +australian psychologist,0005-0067,1742-9544,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,TAYLOR & FRANCIS LTD,NA +australian social work,0312-407X,1447-0748,AusSocialWorkJ,0,1,0,1,NA,Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-07-16 +australian systematic botany,1030-1887,1446-5701,NA,0,0,1,0,Plant Sciences | Evolutionary Biology,NA,NA,CSIRO PUBLISHING,NA +australian veterinary journal,0005-0423,1751-0813,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +austrian history yearbook,0067-2378,1558-5255,NA,1,1,0,0,NA,History,History,CAMBRIDGE UNIV PRESS,NA +austrian history yearbook,0067-2378,1558-5255,NA,1,1,0,0,NA,History,History,CAMBRIDGE UNIV PRESS,NA +austrian journal of earth sciences,2072-7151,2072-7151,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SCIENDO,NA +austrian journal of forest science,0379-5292,0375-524X,NA,0,0,1,0,Forestry,NA,NA,OSTERREICHISCHER AGRARVERLAG,NA +austrian journal of political science,2313-5433,2313-5433,OZP_journal,0,1,0,1,NA,Political Science,NA,OSTERREICHISCHE GESELLSCHAFT POLITIKWISSENSCHAFT,2012-09-18 +austrian studies,1350-7532,2222-4262,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",MODERN HUMANITIES RESEARCH ASSOCIATION,NA +aut aut,0005-0601,NA,aut_journal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",GRUPPO EDITORIALE SAGGIATORE,2014-11-20 +autex research journal,1470-9589,2300-0929,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,SCIENDO,NA +autism,1362-3613,1461-7005,journalautism,0,1,0,1,NA,"Psychology, Development",NA,SAGE PUBLICATIONS LTD,2011-06-21 +autism research,1939-3792,1939-3806,NA,0,1,1,0,Behavioral Sciences,"Psychology, Development",NA,WILEY,NA +autism research,1939-3792,1939-3806,NA,0,1,1,0,Behavioral Sciences,"Psychology, Development",NA,WILEY,NA +autoimmunity,0891-6934,1607-842X,NA,0,0,1,0,Immunology,NA,NA,TAYLOR & FRANCIS LTD,NA +autoimmunity reviews,1568-9972,1873-0183,NA,0,0,1,0,Immunology,NA,NA,ELSEVIER,NA +automated software engineering,0928-8910,1573-7535,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,SPRINGER,NA +automatica,0005-1098,1873-2836,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +automatika,0005-1144,1848-3380,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic",NA,NA,TAYLOR & FRANCIS LTD,NA +automation and remote control,0005-1179,1608-3032,NA,0,0,1,0,Automation & Control Systems | Instruments & Instrumentation,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +automation in construction,0926-5805,1872-7891,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,ELSEVIER,NA +autonomic neuroscience-basic & clinical,1566-0702,1872-7484,NA,0,0,1,0,Neurosciences,NA,NA,ELSEVIER,NA +autonomous agents and multi-agent systems,1387-2532,1573-7454,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Artificial Intelligence",NA,NA,SPRINGER,NA +autonomous robots,0929-5593,1573-7527,AUROblog,0,0,1,1,"Computer Science, Artificial Intelligence | Robotics",NA,NA,SPRINGER,2010-07-05 +autophagy,1554-8627,1554-8635,NA,0,0,1,0,Cell Biology,NA,NA,TAYLOR & FRANCIS INC,NA +avant scene opera,0295-1371,NA,NA,1,0,0,0,NA,NA,Music,AVANT-SCENE OPERA,NA +avian biology research,1758-1559,1758-1567,AvianBiologyRes,0,0,1,1,"Agriculture, Dairy & Animal Science | Ornithology",NA,NA,SAGE PUBLICATIONS LTD,2013-04-03 +avian conservation and ecology,1712-6568,1712-6576,AvianAce,0,0,1,1,Biodiversity Conservation | Ornithology,NA,NA,RESILIENCE ALLIANCE,2012-05-10 +avian diseases,0005-2086,1938-4351,NA,0,0,1,0,Veterinary Sciences,NA,NA,AMER ASSOC AVIAN PATHOLOGISTS,NA +avian pathology,0307-9457,1465-3338,NA,0,0,1,0,Veterinary Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +avian research,2053-7166,2053-7166,avianres,0,0,1,1,Ornithology,NA,NA,BMC,2022-01-18 +axiomathes,1122-1151,1572-8390,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +axioms,2075-1680,2075-1680,Axioms_MDPI,0,0,1,1,"Mathematics, Applied",NA,NA,MDPI,2018-01-18 +ayer,1134-2277,NA,NA,1,1,0,0,NA,History,History,"ASSOC HISTORIA CONTEMPORANEA & MARCIAL PONS, EDICIONES HISTORIA, S A",NA +ayer,1134-2277,NA,NA,1,1,0,0,NA,History,History,"ASSOC HISTORIA CONTEMPORANEA & MARCIAL PONS, EDICIONES HISTORIA, S A",NA +azania-archaeological research in africa,0067-270X,1945-5534,NA,1,0,0,0,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +b-ent,1781-782X,1781-782X,NA,0,0,1,0,Otorhinolaryngology,NA,NA,AVES,NA +b e journal of economic analysis & policy,1935-1682,1935-1682,NA,0,1,0,0,NA,Economics,NA,WALTER DE GRUYTER GMBH,NA +b e journal of macroeconomics,1935-1690,1935-1690,NA,0,1,0,0,NA,Economics,NA,WALTER DE GRUYTER GMBH,NA +b e journal of theoretical economics,1935-1704,1935-1704,NA,0,1,0,0,NA,Economics,NA,WALTER DE GRUYTER GMBH,NA +babel-revue internationale de la traduction-international journal of translation,0521-9744,1569-9668,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +babel-revue internationale de la traduction-international journal of translation,0521-9744,1569-9668,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +bach,0005-3600,0005-3600,NA,1,0,0,0,NA,NA,Music,RIEMENSCHNEIDER BACH INST,NA +balkan journal of medical genetics,1311-0160,1311-0160,NA,0,0,1,0,Genetics & Heredity,NA,NA,SCIENDO,NA +balkan medical journal,2146-3123,2146-3131,balkanmedj,0,0,1,1,"Medicine, General & Internal",NA,NA,AVES,2018-04-02 +baltic forestry,1392-1355,1392-1355,NA,0,0,1,0,Forestry,NA,NA,INST FORESTRY LRCAF,NA +baltic journal of economics,1406-099X,2334-4385,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +baltic journal of management,1746-5265,1746-5273,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +baltic journal of road and bridge engineering,1822-427X,1822-4288,NA,0,0,1,0,"Engineering, Civil",NA,NA,RIGA TECHNICAL UNIV-RTU,NA +baltica,0067-3064,1648-858X,NA,0,0,1,0,Geology,NA,NA,INST GEOLOGY & GEOGRAPHY,NA +banach journal of mathematical analysis,2662-2033,1735-8787,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +bangladesh journal of botany,0253-5416,2079-9926,NA,0,0,1,0,Plant Sciences,NA,NA,BANGLADESH BOTANICAL SOC,NA +bangladesh journal of pharmacology,1991-007X,1991-0088,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,BANGLADESH PHARMACOLOGICAL SOC,NA +bangladesh journal of plant taxonomy,1028-2092,2224-7297,NA,0,0,1,0,Plant Sciences,NA,NA,BANGLADESH ASSOC PLANT TAXONOMISTS,NA +bariatric surgical practice and patient care,2168-023X,2168-0248,NA,0,1,1,0,Nursing | Surgery,Nursing,NA,"MARY ANN LIEBERT, INC",NA +bariatric surgical practice and patient care,2168-023X,2168-0248,NA,0,1,1,0,Nursing | Surgery,Nursing,NA,"MARY ANN LIEBERT, INC",NA +basic & clinical pharmacology & toxicology,1742-7835,1742-7843,BasClinPharmTox,0,0,1,1,Pharmacology & Pharmacy | Toxicology,NA,NA,WILEY,2020-07-08 +basic and applied ecology,1439-1791,1618-0089,BasicApplEcol,0,0,1,1,Ecology,NA,NA,ELSEVIER GMBH,2019-09-12 +basic and applied social psychology,0197-3533,1532-4834,NA,0,1,0,0,NA,"Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +basic and clinical andrology,2051-4190,2051-4190,NA,0,0,1,0,Andrology,NA,NA,BMC,NA +basic research in cardiology,0300-8428,1435-1803,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,SPRINGER HEIDELBERG,NA +basin research,0950-091X,1365-2117,BasinResearch,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,WILEY,2019-06-07 +batteries-basel,2313-0105,2313-0105,batteriesmdpi,0,0,1,1,"Electrochemistry | Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,MDPI,2018-01-26 +batteries & supercaps,2566-6223,2566-6223,Batt_Supercaps,0,0,1,1,"Electrochemistry | Materials Science, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,2017-11-30 +bauingenieur,0005-6650,1436-4867,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,VDI FACHMEDIEN GMBH & CO KG UNTERNEHMEN FACHINFORMATIONEN,NA +bauphysik,0171-5445,1437-0980,NA,0,0,1,0,Construction & Building Technology,NA,NA,ERNST & SOHN,NA +bautechnik,0932-8351,1437-0999,NA,0,0,1,0,"Engineering, Civil",NA,NA,ERNST & SOHN,NA +bayesian analysis,1931-6690,1936-0975,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,INT SOC BAYESIAN ANALYSIS,NA +behavior genetics,0001-8244,1573-3297,NA,0,1,1,0,Behavioral Sciences | Genetics & Heredity,"Psychology, Multidisciplinary",NA,SPRINGER,NA +behavior genetics,0001-8244,1573-3297,NA,0,1,1,0,Behavioral Sciences | Genetics & Heredity,"Psychology, Multidisciplinary",NA,SPRINGER,NA +behavior modification,0145-4455,1552-4167,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SAGE PUBLICATIONS INC,NA +behavior research methods,1554-351X,1554-3528,NA,0,1,0,0,NA,"Psychology, Mathematical | Psychology, Experimental",NA,SPRINGER,NA +behavior therapy,0005-7894,1878-1888,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,ELSEVIER INC,NA +behavioral and brain functions,1744-9081,1744-9081,JournalBbf,0,0,1,1,Behavioral Sciences | Neurosciences,NA,NA,BMC,2021-05-14 +behavioral and brain sciences,0140-525X,1469-1825,BBSJournal,0,1,1,1,Behavioral Sciences | Neurosciences,"Psychology, Biological",NA,CAMBRIDGE UNIV PRESS,2013-12-23 +behavioral and brain sciences,0140-525X,1469-1825,BBSJournal,0,1,1,1,Behavioral Sciences | Neurosciences,"Psychology, Biological",NA,CAMBRIDGE UNIV PRESS,2013-12-23 +behavioral disorders,0198-7429,2163-5307,NA,0,1,0,0,NA,"Psychology, Clinical | Education, Special | Psychology, Educational",NA,SAGE PUBLICATIONS INC,NA +behavioral ecology,1045-2249,1465-7279,BehavEcol,0,0,1,1,Behavioral Sciences | Ecology | Zoology,NA,NA,OXFORD UNIV PRESS INC,2014-10-10 +behavioral ecology and sociobiology,0340-5443,1432-0762,NA,0,0,1,0,Behavioral Sciences | Ecology | Zoology,NA,NA,SPRINGER,NA +behavioral interventions,1072-0847,1099-078X,NA,0,1,0,0,NA,"Psychology, Clinical",NA,WILEY,NA +behavioral medicine,0896-4289,1940-4026,Behavioral_Med,0,1,1,1,Behavioral Sciences | Psychiatry,Psychiatry,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-08-08 +behavioral medicine,0896-4289,1940-4026,Behavioral_Med,0,1,1,1,Behavioral Sciences | Psychiatry,Psychiatry,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-08-08 +behavioral neuroscience,0735-7044,1939-0084,BehavNeuro,0,0,1,1,Behavioral Sciences | Neurosciences,NA,NA,AMER PSYCHOLOGICAL ASSOC,2014-02-17 +behavioral psychology-psicologia conductual,1132-9483,1132-9483,NA,0,1,0,0,NA,"Psychology, Clinical",NA,FUNDACION VECA PARA AVANCE PSICOLOGIA,NA +behavioral sciences,2076-328X,2076-328X,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,MDPI,NA +behavioral sciences & the law,0735-3936,1099-0798,NA,0,1,0,0,NA,"Psychology, Applied | Law",NA,WILEY,NA +behavioral sleep medicine,1540-2002,1540-2010,NA,0,0,1,0,Clinical Neurology | Psychiatry,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +behaviour,0005-7959,1568-539X,NA,0,0,1,0,Behavioral Sciences | Zoology,NA,NA,BRILL,NA +behaviour & information technology,0144-929X,1362-3001,NA,0,1,1,0,"Computer Science, Cybernetics",Ergonomics,NA,TAYLOR & FRANCIS LTD,NA +behaviour & information technology,0144-929X,1362-3001,NA,0,1,1,0,"Computer Science, Cybernetics",Ergonomics,NA,TAYLOR & FRANCIS LTD,NA +behaviour change,0813-4839,2049-7768,AACBT_BEC,0,1,0,1,NA,"Psychology, Clinical",NA,CAMBRIDGE UNIV PRESS,2020-11-19 +behaviour research and therapy,0005-7967,1873-622X,NA,0,1,0,0,NA,"Psychology, Clinical",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +behavioural and cognitive psychotherapy,1352-4658,1469-1833,NA,0,1,0,0,NA,"Psychology, Clinical",NA,CAMBRIDGE UNIV PRESS,NA +behavioural brain research,0166-4328,1872-7549,NA,0,0,1,0,Behavioral Sciences | Neurosciences,NA,NA,ELSEVIER,NA +behavioural neurology,0953-4180,1875-8584,NA,0,0,1,0,Clinical Neurology,NA,NA,HINDAWI LTD,NA +behavioural pharmacology,0955-8810,1473-5849,NA,0,0,1,0,Behavioral Sciences | Neurosciences | Pharmacology & Pharmacy,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +behavioural processes,0376-6357,1872-8308,NA,0,1,1,0,Behavioral Sciences | Zoology,"Psychology, Biological",NA,ELSEVIER,NA +behavioural processes,0376-6357,1872-8308,NA,0,1,1,0,Behavioral Sciences | Zoology,"Psychology, Biological",NA,ELSEVIER,NA +beilstein journal of nanotechnology,2190-4286,2190-4286,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,BEILSTEIN-INSTITUT,NA +beilstein journal of organic chemistry,1860-5397,1860-5397,NA,0,0,1,0,"Chemistry, Organic",NA,NA,BEILSTEIN-INSTITUT,NA +beitrage zur geschichte der deutschen sprache und literatur,0005-8076,1865-9373,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian | Language & Linguistics",WALTER DE GRUYTER GMBH,NA +belgian journal of zoology,0777-6276,2295-0451,NA,0,0,1,0,Zoology,NA,NA,ROYAL BELGIAN ZOOLOGICAL SOC,NA +bell labs technical journal,1089-7089,1538-7305,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +belleten,0041-4255,0041-4255,NA,1,0,0,0,NA,NA,History | Archaeology,TURK TARIH KURUMU,NA +ben jonson journal,1079-3453,1755-165X,NA,1,0,0,0,NA,NA,"Literature, British Isles",EDINBURGH UNIV PRESS,NA +beneficial microbes,1876-2883,1876-2891,journal_BM,0,0,1,1,Microbiology | Nutrition & Dietetics,NA,NA,WAGENINGEN ACADEMIC PUBLISHERS,2017-11-03 +berichte uber landwirtschaft,2196-5099,NA,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,BUNDESMINISTERIUM ERNAHRUNG LANDWIRTSCHAFT,NA +berichte zur wissenschaftsgeschichte,0170-6233,1522-2365,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,WILEY-V C H VERLAG GMBH,NA +berichte zur wissenschaftsgeschichte,0170-6233,1522-2365,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,WILEY-V C H VERLAG GMBH,NA +berichte zur wissenschaftsgeschichte,0170-6233,1522-2365,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,WILEY-V C H VERLAG GMBH,NA +berliner journal fur soziologie,0863-1808,1862-2593,BerlinerJournal,0,1,0,1,NA,Sociology,NA,VS VERLAG SOZIALWISSENSCHAFTEN-GWV FACHVERLAGE GMBH,2020-10-05 +berliner und munchener tierarztliche wochenschrift,0005-9366,1439-0299,NA,0,0,1,0,Veterinary Sciences,NA,NA,SCHLUETERSCHE VERLAGSGESELLSCHAFT MBH & CO KG,NA +bernoulli,1350-7265,1573-9759,NA,0,0,1,0,Statistics & Probability,NA,NA,INT STATISTICAL INST,NA +best practice & research-clinical anaesthesiology,1521-6896,1878-1608,NA,0,0,1,0,Anesthesiology,NA,NA,ELSEVIER,NA +best practice & research clinical endocrinology & metabolism,1521-690X,1532-1908,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ELSEVIER SCI LTD,NA +best practice & research clinical gastroenterology,1521-6918,1532-1916,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,ELSEVIER SCI LTD,NA +best practice & research clinical haematology,1521-6926,1532-1924,NA,0,0,1,0,Hematology,NA,NA,ELSEVIER SCI LTD,NA +best practice & research clinical obstetrics & gynaecology,1521-6934,1532-1932,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,ELSEVIER SCI LTD,NA +best practice & research in clinical rheumatology,1521-6942,1521-1770,NA,0,0,1,0,Rheumatology,NA,NA,ELSEVIER SCI LTD,NA +beton- und stahlbetonbau,0005-9900,1437-1006,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Characterization, Testing | Materials Science, Composites",NA,NA,ERNST & SOHN,NA +betriebswirtschaftliche forschung und praxis,0340-5370,0340-5370,NA,0,1,0,0,NA,Business | Management,NA,VERLAG NEUE WIRTSCHAFTS-BRIEFE,NA +biblica,0006-0887,0006-0887,NA,1,0,0,0,NA,NA,Religion,PEETERS,NA +biblical interpretation-a journal of contemporary approaches,0927-2569,1568-5152,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +bibliotheque d humanisme et renaissance,0006-1999,NA,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,LIBRAIRIE DROZ SA,NA +bibliotheque de l ecole des chartes,0373-6237,1953-8138,LaBEClarevue,1,0,0,1,NA,NA,History,LIBRAIRIE DROZ SA,2020-07-13 +biblische zeitschrift,0006-2014,0006-2014,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +big data,2167-6461,2167-647X,BigData_Journal,0,0,1,1,"Computer Science, Interdisciplinary Applications | Computer Science, Theory & Methods",NA,NA,"MARY ANN LIEBERT, INC",2013-01-10 +big data & society,2053-9517,2053-9517,BigDataSoc,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,2013-07-24 +big data research,2214-5796,2214-5796,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +bijdragen tot de taal- land- en volkenkunde,0006-2294,2213-4379,NA,1,1,0,0,NA,Anthropology,Asian Studies,BRILL,NA +bijdragen tot de taal- land- en volkenkunde,0006-2294,2213-4379,NA,1,1,0,0,NA,Anthropology,Asian Studies,BRILL,NA +bilig,1301-0549,1301-0549,biligdergisi,0,1,0,1,NA,Area Studies,NA,AHMET YESEVI UNIV,2013-04-26 +bilingualism-language and cognition,1366-7289,1469-1841,NA,0,1,0,0,NA,"Linguistics | Psychology, Experimental",NA,CAMBRIDGE UNIV PRESS,NA +bio-design and manufacturing,2096-5524,2522-8552,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,SPRINGER HEIDELBERG,NA +bio-medical materials and engineering,0959-2989,1878-3619,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,IOS PRESS,NA +bioacoustics-the international journal of animal sound and its recording,0952-4622,2165-0586,NA,0,0,1,0,Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +bioactive materials,2452-199X,2452-199X,BioactiveMat,0,0,1,1,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,KEAI PUBLISHING LTD,2021-08-19 +bioagro,1316-3361,2521-9693,NA,0,0,1,0,Agronomy,NA,NA,UNIV CENTROCCIDENTIAL LISANDRO ALVARADO,NA +bioanalysis,1757-6180,1757-6199,fsgbio,0,0,1,1,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,FUTURE SCI LTD,2014-07-29 +biocatalysis and biotransformation,1024-2422,1029-2446,NA,0,0,1,0,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology,NA,NA,TAYLOR & FRANCIS LTD,NA +biocell,0327-9545,1667-5746,NA,0,0,1,0,Biology,NA,NA,TECH SCIENCE PRESS,NA +biochar,2524-7972,2524-7867,NA,0,0,1,0,Environmental Sciences | Soil Science,NA,NA,SPRINGER SINGAPORE PTE LTD,NA +biochemia medica,1330-0962,1846-7482,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,CROATIAN SOC MEDICAL BIOCHEMISTRY & LABORATORY MEDICINE,NA +biochemical and biophysical research communications,0006-291X,1090-2104,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +biochemical engineering journal,1369-703X,1873-295X,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Engineering, Chemical",NA,NA,ELSEVIER,NA +biochemical genetics,0006-2928,1573-4927,NA,0,0,1,0,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +biochemical journal,0264-6021,1470-8728,Biochem_Journal,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,PORTLAND PRESS LTD,2021-01-28 +biochemical pharmacology,0006-2952,1873-2968,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +biochemical society transactions,0300-5127,1470-8752,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,PORTLAND PRESS LTD,NA +biochemical systematics and ecology,0305-1978,1873-2925,NA,0,0,1,0,Biochemistry & Molecular Biology | Ecology | Evolutionary Biology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +biochemistry,0006-2960,1943-295X,BiochemistryACS,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,AMER CHEMICAL SOC,2016-03-12 +biochemistry-moscow,0006-2979,1608-3040,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +biochemistry and cell biology,0829-8211,1208-6002,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +biochemistry and molecular biology education,1470-8175,1539-3429,BAMBEdu,0,0,1,1,"Biochemistry & Molecular Biology | Education, Scientific Disciplines",NA,NA,WILEY,2014-02-05 +biochimica et biophysica acta-bioenergetics,0005-2728,1879-2650,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER,NA +biochimica et biophysica acta-biomembranes,0005-2736,1879-2642,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER,NA +biochimica et biophysica acta-gene regulatory mechanisms,1874-9399,1876-4320,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER,NA +biochimica et biophysica acta-general subjects,0304-4165,1872-8006,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER,NA +biochimica et biophysica acta-molecular and cell biology of lipids,1388-1981,1879-2618,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics | Cell Biology,NA,NA,ELSEVIER,NA +biochimica et biophysica acta-molecular basis of disease,0925-4439,1879-260X,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER,NA +biochimica et biophysica acta-molecular cell research,0167-4889,1879-2596,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,ELSEVIER,NA +biochimica et biophysica acta-proteins and proteomics,1570-9639,1878-1454,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER,NA +biochimica et biophysica acta-reviews on cancer,0304-419X,1879-2561,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics | Oncology,NA,NA,ELSEVIER,NA +biochimie,0300-9084,1638-6183,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +biochip journal,1976-0280,2092-7843,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical | Nanoscience & Nanotechnology",NA,NA,KOREAN BIOCHIP SOCIETY-KBCS,NA +bioconjugate chemistry,1043-1802,1520-4812,BioconjChem,0,0,1,1,"Biochemical Research Methods | Biochemistry & Molecular Biology | Chemistry, Multidisciplinary | Chemistry, Organic",NA,NA,AMER CHEMICAL SOC,2013-12-31 +biocontrol,1386-6141,1573-8248,NA,0,0,1,0,Entomology,NA,NA,SPRINGER,NA +biocontrol science,1342-4815,1884-0205,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,"SOC ANTIBACTERIAL & ANTIFUNGAL AGENTS, JAPAN",NA +biocontrol science and technology,0958-3157,1360-0478,NA,0,0,1,0,Biotechnology & Applied Microbiology | Entomology,NA,NA,TAYLOR & FRANCIS LTD,NA +biocybernetics and biomedical engineering,0208-5216,0208-5216,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,ELSEVIER,NA +biodata mining,1756-0381,1756-0381,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,BMC,NA +biodegradation,0923-9820,1572-9729,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,SPRINGER,NA +biodemography and social biology,1948-5565,1948-5573,biodemography21,0,1,0,1,NA,"Demography | Social Sciences, Biomedical | Sociology",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-01 +biodiversity and conservation,0960-3115,1572-9710,NA,0,0,1,0,Biodiversity Conservation | Ecology | Environmental Sciences,NA,NA,SPRINGER,NA +biodiversity data journal,1314-2836,1314-2828,BioDataJournal,0,0,1,1,Biodiversity Conservation,NA,NA,PENSOFT PUBLISHERS,2012-11-29 +biodrugs,1173-8804,1179-190X,BioDrugsJournal,0,0,1,1,Oncology | Immunology | Pharmacology & Pharmacy,NA,NA,ADIS INT LTD,2010-03-17 +bioelectrochemistry,1567-5394,1878-562X,NA,0,0,1,0,Biochemistry & Molecular Biology | Biology | Biophysics | Electrochemistry,NA,NA,ELSEVIER SCIENCE SA,NA +bioelectromagnetics,0197-8462,1521-186X,NA,0,0,1,0,Biology | Biophysics,NA,NA,WILEY,NA +bioenergy research,1939-1234,1939-1242,BioEnergyRE,0,0,1,1,Energy & Fuels | Environmental Sciences,NA,NA,SPRINGER,2021-03-04 +bioengineered,2165-5979,2165-5987,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,TAYLOR & FRANCIS INC,NA +bioengineering-basel,2306-5354,2306-5354,Bioeng_MDPI,0,0,1,1,"Engineering, Biomedical",NA,NA,MDPI,2016-07-16 +bioengineering & translational medicine,2380-6761,2380-6761,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,WILEY,NA +bioessays,0265-9247,1521-1878,NA,0,0,1,0,Biochemistry & Molecular Biology | Biology,NA,NA,WILEY,NA +bioethics,0269-9702,1467-8519,NA,0,1,1,0,Medical Ethics,"Ethics | Social Issues | Social Sciences, Biomedical",NA,WILEY,NA +bioethics,0269-9702,1467-8519,NA,0,1,1,0,Medical Ethics,"Ethics | Social Issues | Social Sciences, Biomedical",NA,WILEY,NA +biofabrication,1758-5082,1758-5090,Biofabrication,0,0,1,1,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,IOP PUBLISHING LTD,2010-04-07 +biofactors,0951-6433,1872-8081,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,WILEY,NA +biofouling,0892-7014,1029-2454,NA,0,0,1,0,Biotechnology & Applied Microbiology | Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +biofuels-uk,1759-7269,1759-7277,NA,0,0,1,0,Energy & Fuels,NA,NA,TAYLOR & FRANCIS LTD,NA +biofuels bioproducts & biorefining-biofpr,1932-104X,1932-1031,NA,0,0,1,0,Biotechnology & Applied Microbiology | Energy & Fuels,NA,NA,WILEY,NA +biogeochemistry,0168-2563,1573-515X,JBiogeochem,0,0,1,1,"Environmental Sciences | Geosciences, Multidisciplinary",NA,NA,SPRINGER,2019-01-09 +biogeosciences,1726-4170,1726-4189,EGU_BioGeo,0,0,1,1,"Ecology | Geosciences, Multidisciplinary",NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-10 +biogerontology,1389-5729,1573-6768,BiogerontologyJ,0,0,1,1,Geriatrics & Gerontology,NA,NA,SPRINGER,2014-10-17 +biography-an interdisciplinary quarterly,0162-4962,1529-1456,NA,1,0,0,0,NA,NA,Literature,UNIV HAWAII PRESS,NA +bioimpacts,2228-5652,2228-5660,bioimpacts,0,0,1,1,Pharmacology & Pharmacy,NA,NA,TABRIZ UNIV MEDICAL SCIENCES & HEALTH SERVICES,NA +bioinformatics,1367-4803,1460-2059,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology | Mathematical & Computational Biology,NA,NA,OXFORD UNIV PRESS,NA +bioinorganic chemistry and applications,1565-3633,1687-479X,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,HINDAWI LTD,NA +bioinspiration & biomimetics,1748-3182,1748-3190,BioinspBiomim,0,0,1,1,"Engineering, Multidisciplinary | Materials Science, Biomaterials | Robotics",NA,NA,IOP PUBLISHING LTD,2015-12-04 +bioinspired biomimetic and nanobiomaterials,2045-9858,2045-9866,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,ICE PUBLISHING,NA +biointerphases,1934-8630,1559-4106,biointerphases,0,0,1,1,"Biophysics | Materials Science, Biomaterials",NA,NA,AIP PUBLISHING,2016-01-08 +bioinvasions records,2242-1300,2242-1300,NA,0,0,1,0,Biodiversity Conservation,NA,NA,REGIONAL EURO-ASIAN BIOLOGICAL INVASIONS CENTRE-REABIC,NA +biologia,0006-3088,1336-9563,NA,0,0,1,0,Biology,NA,NA,SPRINGER,NA +biologia futura,2676-8615,2676-8607,NA,0,0,1,0,Biology,NA,NA,SPRINGER HEIDELBERG,NA +biologia plantarum,0006-3134,1573-8264,NA,0,0,1,0,Plant Sciences,NA,NA,"ACAD SCIENCES CZECH REPUBLIC, INST EXPERIMENTAL BOTANY",NA +biological & pharmaceutical bulletin,0918-6158,1347-5215,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,PHARMACEUTICAL SOC JAPAN,NA +biological agriculture & horticulture,0144-8765,2165-0616,NA,0,0,1,0,Agronomy | Horticulture,NA,NA,TAYLOR & FRANCIS LTD,NA +biological bulletin,0006-3185,1939-8697,BiolBulletin,0,0,1,1,Biology | Marine & Freshwater Biology,NA,NA,UNIV CHICAGO PRESS,2011-09-12 +biological chemistry,1431-6730,1437-4315,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,WALTER DE GRUYTER GMBH,NA +biological conservation,0006-3207,1873-2917,NA,0,0,1,0,Biodiversity Conservation | Ecology | Environmental Sciences,NA,NA,ELSEVIER SCI LTD,NA +biological control,1049-9644,1090-2112,NA,0,0,1,0,Biotechnology & Applied Microbiology | Entomology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +biological cybernetics,0340-1200,1432-0770,NA,0,0,1,0,"Computer Science, Cybernetics | Neurosciences",NA,NA,SPRINGER,NA +biological invasions,1387-3547,1573-1464,BioInvasions,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,SPRINGER,2016-10-17 +biological journal of the linnean society,0024-4066,1095-8312,BiolJLinnSoc,0,0,1,1,Evolutionary Biology,NA,NA,OXFORD UNIV PRESS,2011-10-18 +biological procedures online,1480-9222,1480-9222,NA,0,0,1,0,Biochemical Research Methods,NA,NA,BMC,NA +biological psychiatry,0006-3223,1873-2402,BiologicalPsyc1,0,0,1,1,Neurosciences | Psychiatry,NA,NA,ELSEVIER SCIENCE INC,2020-03-25 +biological psychiatry-cognitive neuroscience and neuroimaging,2451-9022,2451-9030,NA,0,0,1,0,Neurosciences,NA,NA,ELSEVIER,NA +biological psychology,0301-0511,1873-6246,NA,0,1,1,0,Behavioral Sciences | Psychology,"Psychology, Biological | Psychology, Experimental",NA,ELSEVIER,NA +biological psychology,0301-0511,1873-6246,NA,0,1,1,0,Behavioral Sciences | Psychology,"Psychology, Biological | Psychology, Experimental",NA,ELSEVIER,NA +biological research,0716-9760,0717-6287,NA,0,0,1,0,Biology,NA,NA,SOC BIOLGIA CHILE,NA +biological research for nursing,1099-8004,1552-4175,BRNJournal,0,0,1,1,Nursing,NA,NA,SAGE PUBLICATIONS INC,2019-04-20 +biological reviews,1464-7931,1469-185X,NA,0,0,1,0,Biology,NA,NA,WILEY,NA +biological rhythm research,0929-1016,1744-4179,NA,0,0,1,0,Biology | Physiology,NA,NA,TAYLOR & FRANCIS LTD,NA +biological trace element research,0163-4984,1559-0720,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,SPRINGERNATURE,NA +biologicals,1045-1056,1095-8320,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology | Pharmacology & Pharmacy,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +biologicheskie membrany,0233-4755,NA,NA,0,0,1,0,Cell Biology,NA,NA,MEZHDUNARODNAYA KNIGA,NA +biology-basel,2079-7737,2079-7737,Biology_MDPI,0,0,1,1,Biology,NA,NA,MDPI,2016-03-24 +biology & philosophy,0169-3867,1572-8404,Bio_and_Philo,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER,2017-02-05 +biology & philosophy,0169-3867,1572-8404,Bio_and_Philo,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER,2017-02-05 +biology & philosophy,0169-3867,1572-8404,Bio_and_Philo,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER,2017-02-05 +biology and environment-proceedings of the royal irish academy,0791-7945,2009-003X,NA,0,0,1,0,Environmental Sciences,NA,NA,ROYAL IRISH ACAD,NA +biology and fertility of soils,0178-2762,1432-0789,NA,0,0,1,0,Soil Science,NA,NA,SPRINGER,NA +biology bulletin,1062-3590,1608-3059,NA,0,0,1,0,Biology,NA,NA,PLEIADES PUBLISHING INC,NA +biology direct,1745-6150,1745-6150,NA,0,0,1,0,Biology,NA,NA,BMC,NA +biology letters,1744-9561,1744-957X,NA,0,0,1,0,Biology | Ecology | Evolutionary Biology,NA,NA,ROYAL SOC,NA +biology of reproduction,0006-3363,1529-7268,BiolReprod,0,0,1,1,Reproductive Biology,NA,NA,OXFORD UNIV PRESS INC,2010-06-23 +biology of sex differences,2042-6410,2042-6410,BiologySexDiff,0,0,1,1,Endocrinology & Metabolism | Genetics & Heredity,NA,NA,BMC,2011-06-14 +biology of sport,0860-021X,2083-1862,BiolSport,0,0,1,1,Sport Sciences,NA,NA,TERMEDIA PUBLISHING HOUSE LTD,2016-03-01 +biology of the cell,0248-4900,1768-322X,NA,0,0,1,0,Cell Biology,NA,NA,WILEY,NA +biology open,2046-6390,2046-6390,BiologyOpen,0,0,1,1,Biology,NA,NA,COMPANY BIOLOGISTS LTD,2011-07-06 +biomacromolecules,1525-7797,1526-4602,Biomac_ACS,0,0,1,1,"Biochemistry & Molecular Biology | Chemistry, Organic | Polymer Science",NA,NA,AMER CHEMICAL SOC,2014-04-02 +biomarker research,2050-7771,2050-7771,NA,0,0,1,0,"Oncology | Medicine, Research & Experimental",NA,NA,BMC,NA +biomarkers,1354-750X,1366-5804,NA,0,0,1,0,Biotechnology & Applied Microbiology | Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +biomarkers in medicine,1752-0363,1752-0371,fsgbmm,0,0,1,1,"Medicine, Research & Experimental",NA,NA,FUTURE MEDICINE LTD,2014-07-08 +biomass & bioenergy,0961-9534,1873-2909,NA,0,0,1,0,Agricultural Engineering | Biotechnology & Applied Microbiology | Energy & Fuels,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +biomass conversion and biorefinery,2190-6815,2190-6823,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical",NA,NA,SPRINGER HEIDELBERG,NA +biomaterials,0142-9612,1878-5905,Biomaterials_,0,0,1,1,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,ELSEVIER SCI LTD,2017-08-23 +biomaterials research,1226-4601,2055-7124,NA,0,0,1,0,"Materials Science, Biomaterials | Engineering, Biomedical",NA,NA,SPRINGERNATURE,NA +biomaterials science,2047-4830,2047-4849,BioMaterSci,0,0,1,1,"Materials Science, Biomaterials",NA,NA,ROYAL SOC CHEMISTRY,2012-01-23 +biomechanics and modeling in mechanobiology,1617-7959,1617-7940,NA,0,0,1,0,"Biophysics | Engineering, Biomedical",NA,NA,SPRINGER HEIDELBERG,NA +biomed research international,2314-6133,2314-6141,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Medicine, Research & Experimental",NA,NA,HINDAWI LTD,NA +biomedica,0120-4157,2590-7379,NA,0,0,1,0,Tropical Medicine,NA,NA,INST NACIONAL SALUD,NA +biomedical and environmental sciences,0895-3988,2214-0190,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,CHINESE CENTER DISEASE CONTROL & PREVENTION,NA +biomedical chromatography,0269-3879,1099-0801,NA,0,0,1,0,"Biochemical Research Methods | Biochemistry & Molecular Biology | Chemistry, Analytical | Pharmacology & Pharmacy",NA,NA,WILEY,NA +biomedical engineering-biomedizinische technik,0013-5585,1862-278X,NA,0,0,1,0,"Engineering, Biomedical | Medical Informatics",NA,NA,WALTER DE GRUYTER GMBH,NA +biomedical engineering online,1475-925X,1475-925X,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,BMC,NA +biomedical journal,2319-4170,2320-2890,BiomedJ,0,0,1,1,"Biochemistry & Molecular Biology | Medicine, Research & Experimental",NA,NA,ELSEVIER,2012-12-26 +biomedical materials,1748-6041,1748-605X,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,IOP PUBLISHING LTD,NA +biomedical microdevices,1387-2176,1572-8781,BioMedMicroDev,0,0,1,1,"Engineering, Biomedical | Nanoscience & Nanotechnology",NA,NA,SPRINGER,2021-10-12 +biomedical optics express,2156-7085,2156-7085,NA,0,0,1,0,"Biochemical Research Methods | Optics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,OPTICAL SOC AMER,NA +biomedical papers-olomouc,1213-8118,1804-7521,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,"PALACKY UNIV, MEDICAL FAC",NA +biomedical research-tokyo,0388-6107,1880-313X,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,BIOMEDICAL RESEARCH PRESS LTD,NA +biomedical signal processing and control,1746-8094,1746-8108,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,ELSEVIER SCI LTD,NA +biomedicine & pharmacotherapy,0753-3322,1950-6007,NA,0,0,1,0,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +biomedicines,2227-9059,2227-9059,Biomed_MDPI,0,0,1,1,"Biochemistry & Molecular Biology | Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,MDPI,2017-04-07 +biometals,0966-0844,1572-8773,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,SPRINGER,NA +biometrical journal,0323-3847,1521-4036,NA,0,0,1,0,Mathematical & Computational Biology | Statistics & Probability,NA,NA,WILEY,NA +biometrics,0006-341X,1541-0420,Biometrics_ibs,0,0,1,1,Biology | Mathematical & Computational Biology | Statistics & Probability,NA,NA,WILEY,2018-11-15 +biometrika,0006-3444,1464-3510,NA,0,0,1,0,Biology | Mathematical & Computational Biology | Statistics & Probability,NA,NA,OXFORD UNIV PRESS,NA +biomicrofluidics,1932-1058,1932-1058,NA,0,0,1,0,"Biochemical Research Methods | Biophysics | Nanoscience & Nanotechnology | Physics, Fluids & Plasmas",NA,NA,AIP PUBLISHING,NA +biomolecular nmr assignments,1874-2718,1874-270X,NA,0,0,1,0,Biophysics | Spectroscopy,NA,NA,SPRINGER,NA +biomolecules,2218-273X,2218-273X,Biomol_MDPI,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,MDPI,2015-08-09 +biomolecules & therapeutics,1976-9148,2005-4483,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,KOREAN SOC APPLIED PHARMACOLOGY,NA +bioorganic & medicinal chemistry,0968-0896,1464-3391,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Medicinal | Chemistry, Organic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +bioorganic & medicinal chemistry letters,0960-894X,1464-3405,NA,0,0,1,0,"Chemistry, Medicinal | Chemistry, Organic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +bioorganic chemistry,0045-2068,1090-2120,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Organic",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +biopharm international,1542-166X,1939-1862,NA,0,0,1,0,Biotechnology & Applied Microbiology | Pharmacology & Pharmacy,NA,NA,ADVANSTAR COMMUNICATIONS INC,NA +biopharmaceutics & drug disposition,0142-2782,1099-081X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,WILEY,NA +biophysical chemistry,0301-4622,1873-4200,NA,0,0,1,0,"Biochemistry & Molecular Biology | Biophysics | Chemistry, Physical",NA,NA,ELSEVIER,NA +biophysical journal,0006-3495,1542-0086,BiophysJ,0,0,1,1,Biophysics,NA,NA,CELL PRESS,2015-08-07 +biopolymers,0006-3525,1097-0282,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,WILEY,NA +biopreservation and biobanking,1947-5535,1947-5543,NA,0,0,1,0,Cell Biology | Medical Laboratory Technology,NA,NA,"MARY ANN LIEBERT, INC",NA +bioprocess and biosystems engineering,1615-7591,1615-7605,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Engineering, Chemical",NA,NA,SPRINGER,NA +biopsychosocial medicine,1751-0759,1751-0759,NA,0,1,0,0,NA,"Psychiatry | Psychology, Multidisciplinary",NA,BMC,NA +bioremediation journal,1088-9868,1547-6529,NA,0,0,1,0,Environmental Sciences,NA,NA,TAYLOR & FRANCIS INC,NA +bioresource technology,0960-8524,1873-2976,NA,0,0,1,0,Agricultural Engineering | Biotechnology & Applied Microbiology | Energy & Fuels,NA,NA,ELSEVIER SCI LTD,NA +bioresources,1930-2126,1930-2126,BioResJournal,0,0,1,1,"Materials Science, Paper & Wood",NA,NA,NORTH CAROLINA STATE UNIV DEPT WOOD & PAPER SCI,2013-09-26 +bioresources and bioprocessing,2197-4365,2197-4365,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,SPRINGER HEIDELBERG,NA +biorheology,0006-355X,1878-5034,NA,0,0,1,0,"Biophysics | Engineering, Biomedical | Hematology",NA,NA,IOS PRESS,NA +bioscience,0006-3568,1525-3244,NA,0,0,1,0,Biology,NA,NA,OXFORD UNIV PRESS,NA +bioscience biotechnology and biochemistry,0916-8451,1347-6947,NA,0,0,1,0,"Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Chemistry, Applied | Food Science & Technology",NA,NA,OXFORD UNIV PRESS,NA +bioscience journal,1981-3163,1981-3163,NA,0,0,1,0,"Agriculture, Multidisciplinary | Agronomy | Biology",NA,NA,UNIV FEDERAL UBERLANDIA,NA +bioscience of microbiota food and health,2186-6953,2186-3342,NA,0,0,1,0,Microbiology | Nutrition & Dietetics,NA,NA,BMFH PRESS,NA +bioscience reports,0144-8463,1573-4935,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,PORTLAND PRESS LTD,NA +bioscience trends,1881-7815,1881-7823,BST_Journal,0,0,1,1,Biology,NA,NA,IRCA-BSSA,2020-05-23 +bioscope-south asian screen studies,0974-9276,0976-352X,NA,1,0,0,0,NA,NA,"Film, Radio, Television | Asian Studies",SAGE PUBLICATIONS INDIA PVT LTD,NA +biosemiotics,1875-1342,1875-1350,Biosemiotics_J,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,"History & Philosophy Of Science | Humanities, Multidisciplinary",SPRINGER,2018-07-24 +biosemiotics,1875-1342,1875-1350,Biosemiotics_J,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,"History & Philosophy Of Science | Humanities, Multidisciplinary",SPRINGER,2018-07-24 +biosemiotics,1875-1342,1875-1350,Biosemiotics_J,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,"History & Philosophy Of Science | Humanities, Multidisciplinary",SPRINGER,2018-07-24 +biosensors-basel,2079-6374,2079-6374,Biosensors_MDPI,0,0,1,1,"Chemistry, Analytical | Nanoscience & Nanotechnology | Instruments & Instrumentation",NA,NA,MDPI,2017-01-06 +biosensors & bioelectronics,0956-5663,1873-4235,NA,0,0,1,0,"Biophysics | Biotechnology & Applied Microbiology | Chemistry, Analytical | Electrochemistry | Nanoscience & Nanotechnology",NA,NA,ELSEVIER ADVANCED TECHNOLOGY,NA +biosocieties,1745-8552,1745-8560,NA,0,1,0,0,NA,"Social Sciences, Biomedical",NA,PALGRAVE MACMILLAN LTD,NA +biostatistics,1465-4644,1468-4357,biostatistics,0,0,1,1,Mathematical & Computational Biology | Statistics & Probability,NA,NA,OXFORD UNIV PRESS,2016-02-04 +biosystems,0303-2647,1872-8324,NA,0,0,1,0,Biology | Mathematical & Computational Biology,NA,NA,ELSEVIER SCI LTD,NA +biosystems engineering,1537-5110,1537-5129,NA,0,0,1,0,"Agricultural Engineering | Agriculture, Multidisciplinary",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +biota neotropica,1676-0603,1676-0603,NA,0,0,1,0,Biodiversity Conservation,NA,NA,REVISTA BIOTA NEOTROPICA,NA +biotechnic & histochemistry,1052-0295,1473-7760,NA,0,0,1,0,Biotechnology & Applied Microbiology | Cell Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +biotechniques,0736-6205,1940-9818,MyBioTechniques,0,0,1,1,Biochemical Research Methods | Biochemistry & Molecular Biology,NA,NA,FUTURE SCI LTD,2009-02-18 +biotechnologie agronomie societe et environnement,1370-6233,1780-4507,NA,0,0,1,0,Agronomy | Environmental Sciences,NA,NA,FAC UNIV SCIENCES AGRONOMIQUES GEMBLOUX,NA +biotechnology & biotechnological equipment,1310-2818,1314-3530,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,TAYLOR & FRANCIS LTD,NA +biotechnology & genetic engineering reviews,0264-8725,2046-5556,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,TAYLOR & FRANCIS LTD,NA +biotechnology advances,0734-9750,1873-1899,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +biotechnology and applied biochemistry,0885-4513,1470-8744,NA,0,0,1,0,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology,NA,NA,WILEY,NA +biotechnology and bioengineering,0006-3592,1097-0290,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,WILEY,NA +biotechnology and bioprocess engineering,1226-8372,1976-3816,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,KOREAN SOC BIOTECHNOLOGY & BIOENGINEERING,NA +biotechnology for biofuels,1754-6834,1754-6834,NA,0,0,1,0,Biotechnology & Applied Microbiology | Energy & Fuels,NA,NA,BMC,NA +biotechnology journal,1860-6768,1860-7314,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology,NA,NA,WILEY-V C H VERLAG GMBH,NA +biotechnology law report,0730-031X,1557-8704,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,"MARY ANN LIEBERT, INC",NA +biotechnology letters,0141-5492,1573-6776,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,SPRINGER,NA +biotechnology progress,8756-7938,1520-6033,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology,NA,NA,WILEY,NA +biotropica,0006-3606,1744-7429,Biotropica,0,0,1,1,Ecology,NA,NA,WILEY,2011-06-13 +bipolar disorders,1398-5647,1399-5618,NA,0,0,1,0,Clinical Neurology | Neurosciences | Psychiatry,NA,NA,WILEY,NA +bird conservation international,0959-2709,1474-0001,bci_journal,0,0,1,1,Biodiversity Conservation | Ornithology,NA,NA,CAMBRIDGE UNIV PRESS,2017-11-06 +bird study,0006-3657,1944-6705,NA,0,0,1,0,Ornithology,NA,NA,TAYLOR & FRANCIS LTD,NA +birth-issues in perinatal care,0730-7659,1523-536X,NA,0,1,1,0,Nursing | Obstetrics & Gynecology | Pediatrics,Nursing,NA,WILEY,NA +birth-issues in perinatal care,0730-7659,1523-536X,NA,0,1,1,0,Nursing | Obstetrics & Gynecology | Pediatrics,Nursing,NA,WILEY,NA +birth defects research,2472-1727,2472-1727,NA,0,0,1,0,Developmental Biology | Toxicology,NA,NA,WILEY,NA +bit numerical mathematics,0006-3835,1572-9125,NA,0,0,1,0,"Computer Science, Software Engineering | Mathematics, Applied",NA,NA,SPRINGER,NA +bjog-an international journal of obstetrics and gynaecology,1470-0328,1471-0528,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,WILEY,NA +bjpsych open,2056-4724,2056-4724,NA,0,1,1,0,Psychiatry,Psychiatry,NA,CAMBRIDGE UNIV PRESS,NA +bjpsych open,2056-4724,2056-4724,NA,0,1,1,0,Psychiatry,Psychiatry,NA,CAMBRIDGE UNIV PRESS,NA +bjs open,2474-9842,2474-9842,BjsOpen,0,0,1,1,Surgery,NA,NA,OXFORD UNIV PRESS,2016-12-09 +bju international,1464-4096,1464-410X,BJUIjournal,0,0,1,1,Urology & Nephrology,NA,NA,WILEY,2009-08-11 +bladder cancer,2352-3727,2352-3735,BladderCaJrnl,0,0,1,1,Oncology | Urology & Nephrology,NA,NA,IOS PRESS,2015-05-06 +blood,0006-4971,1528-0020,BloodJournal,0,0,1,1,Hematology,NA,NA,AMER SOC HEMATOLOGY,2015-08-07 +blood advances,2473-9529,2473-9537,BloodAdvances,0,0,1,1,Hematology,NA,NA,ELSEVIER,2016-05-17 +blood cancer journal,2044-5385,2044-5385,BloodCancerJnl,0,0,1,1,Oncology | Hematology,NA,NA,SPRINGERNATURE,2021-07-19 +blood cells molecules and diseases,1079-9796,1096-0961,NA,0,0,1,0,Hematology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +blood coagulation & fibrinolysis,0957-5235,1473-5733,NA,0,0,1,0,Hematology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +blood pressure,0803-7051,1651-1999,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,TAYLOR & FRANCIS LTD,NA +blood pressure monitoring,1359-5237,1473-5725,BloodPressureM,0,0,1,1,Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2012-02-03 +blood purification,0253-5068,1421-9735,NA,0,0,1,0,Hematology | Urology & Nephrology,NA,NA,KARGER,NA +blood reviews,0268-960X,1532-1681,NA,0,0,1,0,Hematology,NA,NA,CHURCHILL LIVINGSTONE,NA +blood transfusion,1723-2007,1723-2007,BloodT_journal,0,0,1,1,Hematology,NA,NA,SIMTIPRO SRL,2017-09-18 +blumea,0006-5196,0373-4293,NA,0,0,1,0,Plant Sciences,NA,NA,RIJKSHERBARIUM,NA +bmb reports,1976-6696,1976-670X,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,KOREAN SOCIETY BIOCHEMISTRY & MOLECULAR BIOLOGY,NA +bmc anesthesiology,1471-2253,1471-2253,NA,0,0,1,0,Anesthesiology,NA,NA,BMC,NA +bmc bioinformatics,1471-2105,1471-2105,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology | Mathematical & Computational Biology,NA,NA,BMC,NA +bmc biology,1741-7007,1741-7007,BMCBiology,0,0,1,1,Biology,NA,NA,BMC,2011-05-16 +bmc biotechnology,1472-6750,1472-6750,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,BMC,NA +bmc cancer,1471-2407,1471-2407,NA,0,0,1,0,Oncology,NA,NA,BMC,NA +bmc cardiovascular disorders,1471-2261,1471-2261,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,BMC,NA +bmc chemistry,2661-801X,2661-801X,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,BMC,NA +bmc complementary medicine and therapies,2662-7671,2662-7671,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,BMC,NA +bmc developmental biology,1471-213X,1471-213X,NA,0,0,1,0,Developmental Biology,NA,NA,BMC,NA +bmc ecology and evolution,2730-7182,2730-7182,NA,0,0,1,0,Genetics & Heredity | Evolutionary Biology | Ecology,NA,NA,BMC,NA +bmc emergency medicine,1471-227X,1471-227X,NA,0,0,1,0,Emergency Medicine,NA,NA,BMC,NA +bmc endocrine disorders,1472-6823,1472-6823,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,BMC,NA +bmc family practice,1471-2296,1471-2296,NA,0,0,1,0,"Primary Health Care | Medicine, General & Internal",NA,NA,BMC,NA +bmc gastroenterology,1471-230X,1471-230X,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,BMC,NA +bmc genomic data,2730-6844,2730-6844,NA,0,0,1,0,Genetics & Heredity,NA,NA,BMC,NA +bmc genomics,1471-2164,1471-2164,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,BMC,NA +bmc geriatrics,1471-2318,1471-2318,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,BMC,NA +bmc geriatrics,1471-2318,1471-2318,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,BMC,NA +bmc health services research,1472-6963,1472-6963,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,BMC,NA +bmc immunology,1471-2172,1471-2172,NA,0,0,1,0,Immunology,NA,NA,BMC,NA +bmc infectious diseases,1471-2334,1471-2334,NA,0,0,1,0,Infectious Diseases,NA,NA,BMC,NA +bmc medical education,1472-6920,1472-6920,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,BMC,NA +bmc medical education,1472-6920,1472-6920,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,BMC,NA +bmc medical ethics,1472-6939,1472-6939,NA,0,1,1,0,Medical Ethics,"Ethics | Social Sciences, Biomedical",NA,BMC,NA +bmc medical ethics,1472-6939,1472-6939,NA,0,1,1,0,Medical Ethics,"Ethics | Social Sciences, Biomedical",NA,BMC,NA +bmc medical genomics,1755-8794,1755-8794,NA,0,0,1,0,Genetics & Heredity,NA,NA,BMC,NA +bmc medical imaging,1471-2342,1471-2342,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,BMC,NA +bmc medical informatics and decision making,1472-6947,1472-6947,NA,0,0,1,0,Medical Informatics,NA,NA,BMC,NA +bmc medical research methodology,1471-2288,1471-2288,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,BMC,NA +bmc medicine,1741-7015,1741-7015,BMCMedicine,0,0,1,1,"Medicine, General & Internal",NA,NA,BMC,2011-05-18 +bmc microbiology,1471-2180,1471-2180,NA,0,0,1,0,Microbiology,NA,NA,BMC,NA +bmc molecular and cell biology,NA,2661-8850,NA,0,0,1,0,Cell Biology,NA,NA,BMC,NA +bmc musculoskeletal disorders,1471-2474,1471-2474,NA,0,0,1,0,Orthopedics | Rheumatology,NA,NA,BMC,NA +bmc nephrology,1471-2369,1471-2369,NA,0,0,1,0,Urology & Nephrology,NA,NA,BMC,NA +bmc neurology,1471-2377,1471-2377,NeuroPsychBMC,0,0,1,1,Clinical Neurology,NA,NA,BMC,2012-08-14 +bmc neuroscience,1471-2202,1471-2202,NA,0,0,1,0,Neurosciences,NA,NA,BMC,NA +bmc nursing,1472-6955,1472-6955,NA,0,1,1,0,Nursing,Nursing,NA,BMC,NA +bmc nursing,1472-6955,1472-6955,NA,0,1,1,0,Nursing,Nursing,NA,BMC,NA +bmc ophthalmology,1471-2415,1471-2415,NA,0,0,1,0,Ophthalmology,NA,NA,BMC,NA +bmc oral health,1472-6831,1472-6831,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,BMC,NA +bmc palliative care,1472-684X,1472-684X,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,BMC,NA +bmc palliative care,1472-684X,1472-684X,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,BMC,NA +bmc pediatrics,1471-2431,1471-2431,NA,0,0,1,0,Pediatrics,NA,NA,BMC,NA +bmc pharmacology & toxicology,2050-6511,2050-6511,NA,0,0,1,0,Pharmacology & Pharmacy | Toxicology,NA,NA,BMC,NA +bmc plant biology,1471-2229,1471-2229,NA,0,0,1,0,Plant Sciences,NA,NA,BMC,NA +bmc pregnancy and childbirth,1471-2393,1471-2393,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,BMC,NA +bmc psychiatry,1471-244X,1471-244X,NA,0,0,1,0,Psychiatry,NA,NA,BMC,NA +bmc psychology,2050-7283,2050-7283,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SPRINGERNATURE,NA +bmc public health,1471-2458,1471-2458,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,BMC,NA +bmc pulmonary medicine,1471-2466,1471-2466,NA,0,0,1,0,Respiratory System,NA,NA,BMC,NA +bmc sports science medicine and rehabilitation,2052-1847,2052-1847,NA,0,0,1,0,Rehabilitation | Sport Sciences,NA,NA,BMC,NA +bmc surgery,1471-2482,1471-2482,BMCSurgery,0,0,1,1,Surgery,NA,NA,BMC,2012-07-24 +bmc urology,1471-2490,1471-2490,NA,0,0,1,0,Urology & Nephrology,NA,NA,BMC,NA +bmc veterinary research,1746-6148,1746-6148,NA,0,0,1,0,Veterinary Sciences,NA,NA,BMC,NA +bmc womens health,1472-6874,1472-6874,NA,0,1,1,0,Obstetrics & Gynecology,"Public, Environmental & Occupational Health",NA,BMC,NA +bmc womens health,1472-6874,1472-6874,NA,0,1,1,0,Obstetrics & Gynecology,"Public, Environmental & Occupational Health",NA,BMC,NA +bmc zoology,2056-3132,2056-3132,NA,0,0,1,0,Zoology,NA,NA,BMC,NA +bmgn-the low countries historical review,0165-0505,2211-2898,BMGN_LCHR,1,1,0,1,NA,History,History,KONINKLIJK NEDERLANDS HISTORISCH GENOOTSCHAP,2012-03-28 +bmgn-the low countries historical review,0165-0505,2211-2898,BMGN_LCHR,1,1,0,1,NA,History,History,KONINKLIJK NEDERLANDS HISTORISCH GENOOTSCHAP,2012-03-28 +bmj-british medical journal,0959-535X,1756-1833,bmj_latest,0,0,1,1,"Medicine, General & Internal",NA,NA,BMJ PUBLISHING GROUP,2008-10-24 +bmj evidence-based medicine,2515-446X,2515-4478,BMJ_EBM,0,0,1,1,"Medicine, General & Internal",NA,NA,BMJ PUBLISHING GROUP,2010-05-13 +bmj global health,2059-7908,2059-7908,GlobalHealthBMJ,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMJ PUBLISHING GROUP,2015-11-03 +bmj global health,2059-7908,2059-7908,GlobalHealthBMJ,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMJ PUBLISHING GROUP,2015-11-03 +bmj military health,2633-3767,2633-3775,MilitaryH_BMJ,0,0,1,1,"Medicine, General & Internal",NA,NA,BMJ PUBLISHING GROUP,2014-04-16 +bmj open,2044-6055,2044-6055,BMJ_Open,0,0,1,1,"Medicine, General & Internal",NA,NA,BMJ PUBLISHING GROUP,2010-08-13 +bmj open diabetes research & care,2052-4897,2052-4897,DiabetesRC,0,0,1,1,Endocrinology & Metabolism,NA,NA,BMJ PUBLISHING GROUP,2013-10-24 +bmj paediatrics open,NA,2399-9772,BMJ_PO,0,0,1,1,Pediatrics,NA,NA,BMJ PUBLISHING GROUP,2018-03-15 +bmj quality & safety,2044-5415,2044-5423,BMJ_Qual_Saf,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,BMJ PUBLISHING GROUP,2010-04-16 +bmj quality & safety,2044-5415,2044-5423,BMJ_Qual_Saf,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,BMJ PUBLISHING GROUP,2010-04-16 +bmj sexual & reproductive health,2515-1991,2515-2009,BMJ_SRH,0,1,1,1,Obstetrics & Gynecology,"Family Studies | Social Sciences, Biomedical",NA,BMJ PUBLISHING GROUP,2010-11-22 +bmj sexual & reproductive health,2515-1991,2515-2009,BMJ_SRH,0,1,1,1,Obstetrics & Gynecology,"Family Studies | Social Sciences, Biomedical",NA,BMJ PUBLISHING GROUP,2010-11-22 +bmj supportive & palliative care,2045-435X,2045-4368,BMJ_SPCare,0,0,1,1,Health Care Sciences & Services,NA,NA,BMJ PUBLISHING GROUP,2010-11-18 +body & society,1357-034X,1460-3632,tcsjournalsage,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2010-03-14 +body image,1740-1445,1873-6807,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry | Psychology, Multidisciplinary",NA,ELSEVIER,NA +bois et forets des tropiques,0006-579X,1777-5760,NA,0,0,1,0,Forestry,NA,NA,CIRAD-CENTRE COOPERATION INT RECHERCHE AGRONOMIQUE POUR,NA +boletim do instituto de pesca,0046-9939,1678-2305,NA,0,0,1,0,Fisheries | Zoology,NA,NA,INST PESCA,NA +boletin de la asociacion de geografos espanoles,0212-9426,2605-3322,NA,0,1,0,0,NA,Geography,NA,ASOCIACION ESPANOLES DE GEOGRAFIA,NA +boletin de la real academia espanola,0210-4822,2445-0898,NA,1,0,0,0,NA,NA,"Literature, Romance",REAL ACAD ESPANOLA,NA +boletin de la sociedad argentina de botanica,1851-2372,1851-2372,NA,0,0,1,0,Plant Sciences,NA,NA,SOC ARGENTINA BOTANICA,NA +boletin de la sociedad espanola de ceramica y vidrio,0366-3175,2173-0431,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,ELSEVIER,NA +boletin de la sociedad geologica mexicana,1405-3322,1405-3322,NA,0,0,1,0,Geology,NA,NA,"UNIV NACIONAL AUTONOMA MEXICO, INST GEOGRAFIA",NA +boletin de malariologia y salud ambiental,1690-4648,NA,NA,0,0,1,0,Infectious Diseases | Parasitology,NA,NA,"INST ALTOS ESTUDIOS, DR ARNOLDO GABOLDON",NA +boletin del museo chileno de arte precolombino,0716-1530,0718-6894,NA,1,0,0,0,NA,NA,Art | Archaeology,MUSEO CHILENO ARTE PRECOLOMBINO,NA +boletin latinoamericano y del caribe de plantas medicinales y aromaticas,0717-7917,0717-7917,NA,0,0,1,0,Integrative & Complementary Medicine | Pharmacology & Pharmacy,NA,NA,MS-EDITIONS,NA +bollettino della societa paleontologica italiana,0375-7633,NA,NA,0,0,1,0,Paleontology,NA,NA,SOC PALEONTOLOGICA ITALIANA,NA +bollettino di geofisica teorica ed applicata,0006-6729,2239-5695,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,IST NAZIONALE DI OCEANOGRAFIA E DI GEOFISICA,NA +bollettino di storia delle scienze matematiche,0392-4432,1724-1650,NA,1,0,1,0,"History & Philosophy Of Science | Mathematics, Interdisciplinary Applications",NA,History & Philosophy Of Science,FABRIZIO SERRA EDITORE,NA +bollettino di storia delle scienze matematiche,0392-4432,1724-1650,NA,1,0,1,0,"History & Philosophy Of Science | Mathematics, Interdisciplinary Applications",NA,History & Philosophy Of Science,FABRIZIO SERRA EDITORE,NA +bone,8756-3282,1873-2763,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ELSEVIER SCIENCE INC,NA +bone & joint journal,2049-4394,2049-4394,BoneJointJ,0,0,1,1,Orthopedics | Surgery,NA,NA,BRITISH EDITORIAL SOC BONE & JOINT SURGERY,2009-02-16 +bone & joint research,2046-3758,2046-3758,BoneJointRes,0,0,1,1,Cell & Tissue Engineering | Orthopedics,NA,NA,BRITISH EDITORIAL SOC BONE & JOINT SURGERY,2012-05-09 +bone marrow transplantation,0268-3369,1476-5365,BMTjournal,0,0,1,1,Oncology | Hematology | Immunology | Transplantation,NA,NA,SPRINGERNATURE,2018-09-11 +bone research,2095-4700,2095-6231,NA,0,0,1,0,Cell & Tissue Engineering,NA,NA,SPRINGERNATURE,NA +book collector,0006-7237,NA,BookCollectoruk,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",COLLECTOR LTD,2016-09-19 +borderline personality disorder and emotion dysregulation,2051-6673,2051-6673,NA,0,0,1,0,Psychiatry,NA,NA,BMC,NA +boreal environment research,1239-6095,1797-2469,BorealResearch,0,0,1,1,Environmental Sciences,NA,NA,FINNISH ENVIRONMENT INST,2019-06-11 +boreas,0300-9483,1502-3885,BoreasJ1972,0,0,1,1,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,WILEY,2021-02-03 +borsa istanbul review,2214-8450,2214-8469,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +bosnian journal of basic medical sciences,1512-8601,1840-4812,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,ASSOC BASIC MEDICAL SCI FEDERATION BOSNIA & HERZEGOVINA SARAJEVO,NA +bosque,0717-9200,0717-9200,NA,0,0,1,0,Forestry,NA,NA,"UNIV AUSTRAL CHILE, FAC CIENCIAS FORESTALES",NA +boston university law review,0006-8047,0006-8047,BULawReview,0,1,0,1,NA,Law,NA,BOSTON UNIV LAW REVIEW,2012-02-09 +botanica marina,0006-8055,1437-4323,NA,0,0,1,0,Plant Sciences | Marine & Freshwater Biology,NA,NA,WALTER DE GRUYTER GMBH,NA +botanica serbica,1821-2158,1821-2638,BSerbica,0,0,1,1,Plant Sciences,NA,NA,"UNIV BELGRADE, INST BOTANY & BOTANICAL GARDEN",2021-03-16 +botanical journal of the linnean society,0024-4074,1095-8339,BotJLinnSoc,0,0,1,1,Plant Sciences,NA,NA,OXFORD UNIV PRESS,2012-01-04 +botanical review,0006-8101,1874-9372,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +botanical sciences,2007-4298,2007-4476,NA,0,0,1,0,Plant Sciences,NA,NA,SOC BOTANICA MEXICO,NA +botanical studies,1999-3110,1999-3110,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +botany,1916-2790,1916-2804,NA,0,0,1,0,Plant Sciences,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +botany letters,2381-8107,2381-8115,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +bothalia,0006-8241,2311-9284,NA,0,0,1,0,Plant Sciences,NA,NA,AOSIS,NA +boundary-layer meteorology,0006-8314,1573-1472,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,SPRINGER,NA +boundary 2-an international journal of literature and culture,0190-3659,1527-2141,NA,1,1,0,0,NA,Cultural Studies,Literature | Cultural Studies,DUKE UNIV PRESS,NA +boundary 2-an international journal of literature and culture,0190-3659,1527-2141,NA,1,1,0,0,NA,Cultural Studies,Literature | Cultural Studies,DUKE UNIV PRESS,NA +boundary value problems,1687-2770,1687-2770,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER,NA +brachytherapy,1538-4721,1873-1449,BrachyJournal,0,0,1,1,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,2018-07-26 +bradleya,0265-086X,NA,NA,0,0,1,0,Plant Sciences,NA,NA,BRITISH CACTUS & SUCCULENT SOC,NA +bragantia,0006-8705,1678-4499,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,INST AGRONOMICO,NA +brain,0006-8950,1460-2156,Brain1878,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,OXFORD UNIV PRESS,2014-01-15 +brain & development,0387-7604,1872-7131,NA,0,0,1,0,Clinical Neurology | Pediatrics,NA,NA,ELSEVIER,NA +brain and behavior,2162-3279,2162-3279,NA,0,0,1,0,Behavioral Sciences | Neurosciences,NA,NA,WILEY,NA +brain and cognition,0278-2626,1090-2147,NA,0,1,1,0,Neurosciences,"Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +brain and cognition,0278-2626,1090-2147,NA,0,1,1,0,Neurosciences,"Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +brain and language,0093-934X,1090-2155,NA,0,1,1,0,Audiology & Speech-Language Pathology | Neurosciences,"Linguistics | Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +brain and language,0093-934X,1090-2155,NA,0,1,1,0,Audiology & Speech-Language Pathology | Neurosciences,"Linguistics | Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +brain behavior and evolution,0006-8977,1421-9743,NA,0,0,1,0,Behavioral Sciences | Neurosciences | Zoology,NA,NA,KARGER,NA +brain behavior and immunity,0889-1591,1090-2139,BrainBehavImm,0,0,1,1,Immunology | Neurosciences | Psychiatry,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2014-08-26 +brain connectivity,2158-0014,2158-0022,NA,0,0,1,0,Neurosciences,NA,NA,"MARY ANN LIEBERT, INC",NA +brain imaging and behavior,1931-7557,1931-7565,BrainImagBehav,0,0,1,1,Neuroimaging,NA,NA,SPRINGER,NA +brain impairment,1443-9646,1839-5252,BrainImpairment,0,0,1,1,Clinical Neurology | Neurosciences | Rehabilitation,NA,NA,CAMBRIDGE UNIV PRESS,2020-06-15 +brain injury,0269-9052,1362-301X,NA,0,1,1,0,Neurosciences | Rehabilitation,Rehabilitation,NA,TAYLOR & FRANCIS LTD,NA +brain injury,0269-9052,1362-301X,NA,0,1,1,0,Neurosciences | Rehabilitation,Rehabilitation,NA,TAYLOR & FRANCIS LTD,NA +brain pathology,1015-6305,1750-3639,brainpathol,0,0,1,1,Clinical Neurology | Neurosciences | Pathology,NA,NA,WILEY,2020-01-14 +brain research,0006-8993,1872-6240,NA,0,0,1,0,Neurosciences,NA,NA,ELSEVIER,NA +brain research bulletin,0361-9230,1873-2747,NA,0,0,1,0,Neurosciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +brain sciences,2076-3425,2076-3425,BrainSci_MDPI,0,0,1,1,Neurosciences,NA,NA,MDPI,2017-01-06 +brain stimulation,1935-861X,1876-4754,brainstimj,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,ELSEVIER SCIENCE INC,2019-04-23 +brain structure & function,1863-2653,1863-2661,BrainStrucFunc,0,0,1,1,Anatomy & Morphology | Neurosciences,NA,NA,SPRINGER HEIDELBERG,2020-05-15 +brain topography,0896-0267,1573-6792,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,SPRINGER,NA +brain tumor pathology,1433-7398,1861-387X,NA,0,0,1,0,Oncology | Clinical Neurology | Pathology,NA,NA,SPRINGER JAPAN KK,NA +bratislava medical journal-bratislavske lekarske listy,0006-9248,1336-0345,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,AEPRESS SRO,NA +brazilian archives of biology and technology,1516-8913,1678-4324,NA,0,0,1,0,Biology,NA,NA,INST TECNOLOGIA PARANA,NA +brazilian journal of anesthesiology,0104-0014,2352-2291,NA,0,0,1,0,Anesthesiology,NA,NA,ELSEVIER SCIENCE INC,NA +brazilian journal of botany,0100-8404,1806-9959,BrJournalBotany,0,0,1,1,Plant Sciences,NA,NA,SOC BOTANICA SAO PAULO,2021-04-09 +brazilian journal of cardiovascular surgery,0102-7638,1678-9741,NA,0,0,1,0,Cardiac & Cardiovascular System | Surgery,NA,NA,SOC BRASIL CIRURGIA CARDIOVASC,NA +brazilian journal of chemical engineering,0104-6632,1678-4383,NA,0,0,1,0,"Engineering, Chemical",NA,NA,SPRINGER HEIDELBERG,NA +brazilian journal of geology,2317-4889,2317-4692,BrazJGeology,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,SOC BRASILEIRA GEOLOGIA,2017-06-04 +brazilian journal of infectious diseases,1413-8670,1678-4391,NA,0,0,1,0,Infectious Diseases,NA,NA,ELSEVIER BRAZIL,NA +brazilian journal of medical and biological research,0100-879X,1414-431X,NA,0,0,1,0,"Biology | Medicine, Research & Experimental",NA,NA,ASSOC BRAS DIVULG CIENTIFICA,NA +brazilian journal of microbiology,1517-8382,1678-4405,NA,0,0,1,0,Microbiology,NA,NA,SPRINGER,NA +brazilian journal of otorhinolaryngology,1808-8694,1808-8686,NA,0,0,1,0,Otorhinolaryngology,NA,NA,ASSOC BRASILEIRA OTORRINOLARINGOLOGIA & CIRURGIA CERVICOFACIAL,NA +brazilian journal of pharmaceutical sciences,1984-8250,2175-9790,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,"UNIV SAO PAULO, CONJUNTO QUIMICAS",NA +brazilian journal of physical therapy,1413-3555,1809-9246,BrazJPhysTher,0,0,1,1,Orthopedics | Rehabilitation,NA,NA,ASSOCIACAO BRASILEIRA PESQUISA POS-GRADUACAO FISIOTERAPIA-ABRAPG-FT,2019-07-17 +brazilian journal of physics,0103-9733,1678-4448,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SPRINGER,NA +brazilian journal of poultry science,1516-635X,1806-9061,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,FACTA-FUNDACIO ARNCO CIENCIA TECNOLOGIA AVICOLAS,NA +brazilian journal of probability and statistics,0103-0752,0103-0752,NA,0,0,1,0,Statistics & Probability,NA,NA,BRAZILIAN STATISTICAL ASSOCIATION,NA +brazilian journal of psychiatry,1516-4446,1809-452X,brazjpsychiatry,0,1,1,1,Psychiatry,Psychiatry,NA,ASSOC BRASILEIRA PSIQUIATRIA,2017-03-20 +brazilian journal of psychiatry,1516-4446,1809-452X,brazjpsychiatry,0,1,1,1,Psychiatry,Psychiatry,NA,ASSOC BRASILEIRA PSIQUIATRIA,2017-03-20 +brazilian oral research,1807-3107,1807-3107,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,SOCIEDADE BRASILEIRA DE PESQUISA ODONTOLOGICA,NA +breast,0960-9776,1532-3080,NA,0,0,1,0,Oncology | Obstetrics & Gynecology,NA,NA,CHURCHILL LIVINGSTONE,NA +breast cancer,1340-6868,1880-4233,NA,0,0,1,0,Oncology | Obstetrics & Gynecology,NA,NA,SPRINGER JAPAN KK,NA +breast cancer research,1465-5411,1465-542X,BCRJournal,0,0,1,1,Oncology,NA,NA,BMC,2015-10-29 +breast cancer research and treatment,0167-6806,1573-7217,NA,0,0,1,0,Oncology,NA,NA,SPRINGER,NA +breast care,1661-3791,1661-3805,NA,0,0,1,0,Oncology | Obstetrics & Gynecology,NA,NA,KARGER,NA +breast journal,1075-122X,1524-4741,NA,0,0,1,0,Oncology | Obstetrics & Gynecology,NA,NA,WILEY,NA +breastfeeding medicine,1556-8253,1556-8342,NA,0,0,1,0,Obstetrics & Gynecology | Pediatrics,NA,NA,"MARY ANN LIEBERT, INC",NA +breeding science,1344-7610,1347-3735,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,JAPANESE SOC BREEDING,NA +briefings in bioinformatics,1467-5463,1477-4054,NA,0,0,1,0,Biochemical Research Methods | Mathematical & Computational Biology,NA,NA,OXFORD UNIV PRESS,NA +briefings in functional genomics,2041-2649,2041-2657,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,OXFORD UNIV PRESS,NA +britain and the world,2043-8567,2043-8575,NA,1,1,0,0,NA,History,History,EDINBURGH UNIV PRESS,NA +britain and the world,2043-8567,2043-8575,NA,1,1,0,0,NA,History,History,EDINBURGH UNIV PRESS,NA +britannia,0068-113X,1753-5352,NA,1,0,0,0,NA,NA,History | Archaeology,CAMBRIDGE UNIV PRESS,NA +british accounting review,0890-8389,1095-8347,bafa_bar,0,1,0,1,NA,"Business, Finance",NA,ELSEVIER SCI LTD,2021-10-23 +british catholic history,2055-7973,2055-7981,NA,1,0,0,0,NA,NA,Religion | History,CAMBRIDGE UNIV PRESS,NA +british dental journal,0007-0610,1476-5373,The_BDJ,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,SPRINGERNATURE,2012-02-01 +british educational research journal,0141-1926,1469-3518,BERJ_Editors,0,1,0,1,NA,Education & Educational Research,NA,WILEY,2018-03-26 +british food journal,0007-070X,1758-4108,NA,0,0,1,0,Agricultural Economics & Policy | Food Science & Technology,NA,NA,EMERALD GROUP PUBLISHING LTD,NA +british journal for the history of philosophy,0960-8788,1469-3526,BJHP_1993,1,0,0,1,NA,NA,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-20 +british journal for the history of science,0007-0874,1474-001X,BJHSeditor,1,1,0,1,NA,History & Philosophy Of Science,History & Philosophy Of Science,CAMBRIDGE UNIV PRESS,2012-05-11 +british journal for the history of science,0007-0874,1474-001X,BJHSeditor,1,1,0,1,NA,History & Philosophy Of Science,History & Philosophy Of Science,CAMBRIDGE UNIV PRESS,2012-05-11 +british journal for the philosophy of science,0007-0882,1464-3537,TheBJPS,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2012-03-21 +british journal for the philosophy of science,0007-0882,1464-3537,TheBJPS,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2012-03-21 +british journal for the philosophy of science,0007-0882,1464-3537,TheBJPS,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2012-03-21 +british journal of aesthetics,0007-0904,1468-2842,BJAtweets,1,0,0,1,NA,NA,Philosophy | Art,OXFORD UNIV PRESS,2020-01-10 +british journal of anaesthesia,0007-0912,1471-6771,BJAJournals,0,0,1,1,Anesthesiology,NA,NA,ELSEVIER SCI LTD,2015-06-27 +british journal of biomedical science,0967-4845,NA,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +british journal of canadian studies,0269-9222,1757-8078,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",LIVERPOOL UNIV PRESS,NA +british journal of cancer,0007-0920,1532-1827,BrJCancer,0,0,1,1,Oncology,NA,NA,SPRINGERNATURE,2016-08-10 +british journal of clinical pharmacology,0306-5251,1365-2125,BritJClinPharm,0,0,1,1,Pharmacology & Pharmacy,NA,NA,WILEY,2014-01-09 +british journal of clinical psychology,0144-6657,2044-8260,NA,0,1,0,0,NA,"Psychology, Clinical",NA,WILEY,NA +british journal of criminology,0007-0955,1464-3529,NA,0,1,0,0,NA,Criminology & Penology,NA,OXFORD UNIV PRESS,NA +british journal of dermatology,0007-0963,1365-2133,BrJDermatol,0,0,1,1,Dermatology,NA,NA,WILEY,2013-05-15 +british journal of developmental psychology,0261-510X,2044-835X,NA,0,1,0,0,NA,"Psychology, Development",NA,WILEY,NA +british journal of educational psychology,0007-0998,2044-8279,NA,0,1,0,0,NA,"Psychology, Educational",NA,WILEY,NA +british journal of educational studies,0007-1005,1467-8527,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +british journal of educational technology,0007-1013,1467-8535,NA,0,1,0,0,NA,Education & Educational Research,NA,WILEY,NA +british journal of general practice,0960-1643,1478-5242,BJGPjournal,0,0,1,1,"Primary Health Care | Medicine, General & Internal",NA,NA,ROYAL COLL GENERAL PRACTITIONERS,2011-12-07 +british journal of guidance & counselling,0306-9885,1469-3534,BJGCJournal,0,1,0,1,NA,"Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-01-26 +british journal of haematology,0007-1048,1365-2141,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +british journal of health psychology,1359-107X,2044-8287,NA,0,1,0,0,NA,"Psychology, Clinical",NA,WILEY,NA +british journal of hospital medicine,1750-8460,1759-7390,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MA HEALTHCARE LTD,NA +british journal of industrial relations,0007-1080,1467-8543,NA,0,1,0,0,NA,Industrial Relations & Labor,NA,WILEY,NA +british journal of learning disabilities,1354-4187,1468-3156,BJLD_Wiley,0,1,0,1,NA,"Education, Special",NA,WILEY,2020-05-02 +british journal of management,1045-3172,1467-8551,BJM_BAM,0,1,0,1,NA,Business | Management,NA,WILEY,2017-04-28 +british journal of mathematical & statistical psychology,0007-1102,2044-8317,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Psychology, Mathematical | Psychology, Experimental",NA,WILEY,NA +british journal of mathematical & statistical psychology,0007-1102,2044-8317,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Psychology, Mathematical | Psychology, Experimental",NA,WILEY,NA +british journal of middle eastern studies,1353-0194,1469-3542,NA,1,1,0,0,NA,Area Studies,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +british journal of middle eastern studies,1353-0194,1469-3542,NA,1,1,0,0,NA,Area Studies,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +british journal of music education,0265-0517,1469-2104,BJMEMusic,1,1,0,1,NA,Education & Educational Research,Music,CAMBRIDGE UNIV PRESS,2012-03-09 +british journal of music education,0265-0517,1469-2104,BJMEMusic,1,1,0,1,NA,Education & Educational Research,Music,CAMBRIDGE UNIV PRESS,2012-03-09 +british journal of neurosurgery,0268-8697,1360-046X,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,TAYLOR & FRANCIS LTD,NA +british journal of nutrition,0007-1145,1475-2662,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,CAMBRIDGE UNIV PRESS,NA +british journal of occupational therapy,0308-0226,1477-6006,BJOTeditor,0,1,1,1,Rehabilitation,Rehabilitation,NA,SAGE PUBLICATIONS LTD,2013-08-15 +british journal of occupational therapy,0308-0226,1477-6006,BJOTeditor,0,1,1,1,Rehabilitation,Rehabilitation,NA,SAGE PUBLICATIONS LTD,2013-08-15 +british journal of ophthalmology,0007-1161,1468-2079,NA,0,0,1,0,Ophthalmology,NA,NA,BMJ PUBLISHING GROUP,NA +british journal of oral & maxillofacial surgery,0266-4356,1532-1940,BJOMS_official,0,0,1,1,"Dentistry, Oral Surgery & Medicine | Surgery",NA,NA,CHURCHILL LIVINGSTONE,2020-07-07 +british journal of pharmacology,0007-1188,1476-5381,BrJPharmacol,0,0,1,1,Pharmacology & Pharmacy,NA,NA,WILEY,2014-01-03 +british journal of political science,0007-1234,1469-2112,BJPolS,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2010-02-08 +british journal of politics & international relations,1369-1481,1467-856X,BritJPIR,0,1,0,1,NA,International Relations | Political Science,NA,SAGE PUBLICATIONS INC,2016-01-18 +british journal of psychiatry,0007-1250,1472-1465,NA,0,1,1,0,Psychiatry,Psychiatry,NA,CAMBRIDGE UNIV PRESS,NA +british journal of psychiatry,0007-1250,1472-1465,NA,0,1,1,0,Psychiatry,Psychiatry,NA,CAMBRIDGE UNIV PRESS,NA +british journal of psychology,0007-1269,2044-8295,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,WILEY,NA +british journal of radiology,0007-1285,1748-880X,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,BRITISH INST RADIOLOGY,NA +british journal of religious education,0141-6200,1740-7931,NA,1,1,0,0,NA,Education & Educational Research,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +british journal of religious education,0141-6200,1740-7931,NA,1,1,0,0,NA,Education & Educational Research,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +british journal of social psychology,0144-6665,2044-8309,NA,0,1,0,0,NA,"Psychology, Social",NA,WILEY,NA +british journal of social work,0045-3102,1468-263X,BJofSW,0,1,0,1,NA,Social Work,NA,OXFORD UNIV PRESS,2016-02-13 +british journal of sociology,0007-1315,1468-4446,bjsociology,0,1,0,1,NA,Sociology,NA,WILEY,2015-01-14 +british journal of sociology of education,0142-5692,1465-3346,BJSocEd,0,1,0,1,NA,Education & Educational Research | Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-08-02 +british journal of sports medicine,0306-3674,1473-0480,BJSM_BMJ,0,0,1,1,Sport Sciences,NA,NA,BMJ PUBLISHING GROUP,2010-04-30 +british journal of surgery,0007-1323,1365-2168,BJSurgery,0,0,1,1,Surgery,NA,NA,OXFORD UNIV PRESS,2011-03-15 +british medical bulletin,0007-1420,1471-8391,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,OXFORD UNIV PRESS,NA +british politics,1746-918X,1746-9198,NA,0,1,0,0,NA,Political Science,NA,PALGRAVE MACMILLAN LTD,NA +british poultry science,0007-1668,1466-1799,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,TAYLOR & FRANCIS LTD,NA +brittonia,0007-196X,1938-436X,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +brodogradnja,0007-215X,1845-5859,NA,0,0,1,0,"Engineering, Marine",NA,NA,UNIV ZAGREB FAC MECHANICAL ENGINEERING & NAVAL ARCHITECTURE,NA +bronte studies,1474-8932,1745-8226,NA,1,0,0,0,NA,NA,"Literature, British Isles","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +brookings papers on economic activity,0007-2303,1533-4465,NA,0,1,0,0,NA,Economics,NA,BROOKINGS INST PRESS,NA +brq-business research quarterly,2340-9436,2340-9444,BrqBusiness,0,1,0,1,NA,Business | Management,NA,SAGE PUBLICATIONS INC,2020-03-10 +bruniana & campanelliana,1125-3819,1724-0441,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,FABRIZIO SERRA EDITORE,NA +bryologist,0007-2745,1938-4378,NA,0,0,1,0,Plant Sciences,NA,NA,AMER BRYOLOGICAL LICHENOLOGICAL SOC INC,NA +bsgf-earth sciences bulletin,0037-9409,1777-5817,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,EDP SCIENCES S A,NA +buddhist studies review,0265-2897,1747-9681,NA,1,0,0,0,NA,NA,Religion,EQUINOX PUBLISHING LTD,NA +buffalo bulletin,0125-6726,0125-6726,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,INT BUFFALO INFORMATION CTR,NA +buffalo law review,0023-9356,0023-9356,buffalolawrev,0,1,0,1,NA,Law,NA,UNIV BUFFALO STATE UNIV NEW YORK,2017-03-28 +building and environment,0360-1323,1873-684X,NA,0,0,1,0,"Construction & Building Technology | Engineering, Environmental | Engineering, Civil",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +building research and information,0961-3218,1466-4321,NA,0,0,1,0,Construction & Building Technology,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +building services engineering research & technology,0143-6244,1477-0849,NA,0,0,1,0,Construction & Building Technology,NA,NA,SAGE PUBLICATIONS LTD,NA +building simulation,1996-3599,1996-8744,NA,0,0,1,0,Thermodynamics | Construction & Building Technology,NA,NA,TSINGHUA UNIV PRESS,NA +buildings,2075-5309,2075-5309,Buildings_MDPI,0,0,1,1,"Construction & Building Technology | Engineering, Civil",NA,NA,MDPI,2017-11-17 +buildings & landscapes-journal of the vernacular architecture forum,1936-0886,1934-6832,NA,1,0,0,0,NA,NA,Architecture,UNIV MINNESOTA PRESS,NA +bulgarian historical review-revue bulgare d histoire,0204-8906,NA,NA,1,0,0,0,NA,NA,History,PUBL HOUSE BULGARIAN ACAD SCI,NA +bulletin de correspondance hellenique,0007-4217,2241-0104,NA,1,0,0,0,NA,NA,Archaeology,DIFFUSION DE BOCCARD,NA +bulletin de l academie nationale de medecine,0001-4079,2271-4820,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ELSEVIER MASSON SAS EDITEUR,NA +bulletin de la societe linneenne de lyon,2554-5280,NA,NA,0,0,1,0,Biology,NA,NA,SOC LINNEENNE LYON,NA +bulletin de la societe mathematique de france,0037-9484,2102-622X,NA,0,0,1,0,Mathematics,NA,NA,FRENCH MATHEMATICAL SOC,NA +bulletin des sciences mathematiques,0007-4497,1952-4773,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ELSEVIER,NA +bulletin du cancer,0007-4551,1769-6917,NA,0,0,1,0,Oncology,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",NA +bulletin hispanique,0007-4640,NA,NA,1,0,0,0,NA,NA,"Literature, Romance",PRESSES UNIV BORDEAUX,NA +bulletin mathematique de la societe des sciences mathematiques de roumanie,1220-3874,2065-0264,NA,0,0,1,0,Mathematics,NA,NA,SOC MATEMATICE ROMANIA,NA +bulletin monumental,0007-473X,NA,NA,1,0,0,0,NA,NA,Architecture | Archaeology,SOC FR ARCHEOLOGIE MUSEE MONUMENT FRANCAIS,NA +bulletin of earthquake engineering,1570-761X,1573-1456,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +bulletin of economic research,0307-3378,1467-8586,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +bulletin of engineering geology and the environment,1435-9529,1435-9537,NA,0,0,1,0,"Engineering, Environmental | Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +bulletin of entomological research,0007-4853,1475-2670,NA,0,0,1,0,Entomology,NA,NA,CAMBRIDGE UNIV PRESS,NA +bulletin of environmental contamination and toxicology,0007-4861,1432-0800,NA,0,0,1,0,Environmental Sciences | Toxicology,NA,NA,SPRINGER,NA +bulletin of experimental biology and medicine,0007-4888,1573-8221,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,SPRINGER,NA +bulletin of geosciences,1214-1119,1802-8225,NA,0,0,1,0,"Geosciences, Multidisciplinary | Paleontology",NA,NA,CZECH GEOLOGICAL SURVEY,NA +bulletin of hispanic studies,1475-3839,1478-3398,NA,1,0,0,0,NA,NA,"Literature, Romance",LIVERPOOL UNIV PRESS,NA +bulletin of indonesian economic studies,0007-4918,1472-7234,BIESjournal,0,1,0,1,NA,Area Studies | Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-04-22 +bulletin of insectology,1721-8861,2283-0332,NA,0,0,1,0,Entomology,NA,NA,"ALMA MATER STUDIORUM, UNIV BOLOGNA",NA +bulletin of latin american research,0261-3050,1470-9856,NA,0,1,0,0,NA,Area Studies,NA,WILEY,NA +bulletin of marine science,0007-4977,1553-6955,BullMarSci,0,0,1,1,Marine & Freshwater Biology | Oceanography,NA,NA,ROSENSTIEL SCH MAR ATMOS SCI,2015-06-08 +bulletin of materials science,0250-4707,0973-7669,BulletinofMate1,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,INDIAN ACAD SCIENCES,2021-07-01 +bulletin of mathematical biology,0092-8240,1522-9602,NA,0,0,1,0,Biology | Mathematical & Computational Biology,NA,NA,SPRINGER,NA +bulletin of mathematical sciences,1664-3607,1664-3615,NA,0,0,1,0,Mathematics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +bulletin of spanish studies,1475-3820,1478-3428,NA,1,0,0,0,NA,NA,"Literature, Romance","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +bulletin of symbolic logic,1079-8986,1943-5894,NA,0,0,1,0,Mathematics | Logic,NA,NA,CAMBRIDGE UNIV PRESS,NA +bulletin of the american mathematical society,0273-0979,1088-9485,NA,0,0,1,0,Mathematics,NA,NA,AMER MATHEMATICAL SOC,NA +bulletin of the american meteorological society,0003-0007,1520-0477,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,AMER METEOROLOGICAL SOC,NA +bulletin of the american museum of natural history,0003-0090,1937-3546,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,AMER MUSEUM NATURAL HISTORY,NA +bulletin of the american schools of oriental research,0003-097X,2161-8062,NA,1,0,0,0,NA,NA,Archaeology,UNIV CHICAGO PRESS,NA +bulletin of the american society of papyrologists,0003-1186,1938-6958,NA,1,0,0,0,NA,NA,Archaeology,PEETERS,NA +bulletin of the atomic scientists,0096-3402,1938-3282,BulletinAtomic,0,1,0,1,NA,International Relations | Social Issues,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2011-03-15 +bulletin of the australian mathematical society,0004-9727,1755-1633,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +bulletin of the belgian mathematical society-simon stevin,1370-1444,2034-1970,NA,0,0,1,0,Mathematics,NA,NA,BELGIAN MATHEMATICAL SOC TRIOMPHE,NA +bulletin of the brazilian mathematical society,1678-7544,1678-7714,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +bulletin of the chemical society of ethiopia,1011-3924,1726-801X,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CHEM SOC ETHIOPIA,NA +bulletin of the chemical society of japan,0009-2673,1348-0634,CSJjournals_jp,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,CHEMICAL SOC JAPAN,2018-04-06 +bulletin of the comediantes,0007-5108,1944-0928,BComediantes,1,0,0,1,NA,NA,Theater,AUBURN UNIV,2019-01-23 +bulletin of the council for research in music education,0010-9894,2162-7223,NA,1,0,0,0,NA,NA,Music,UNIV ILLINOIS PRESS,NA +bulletin of the european association of fish pathologists,0108-0288,0108-0288,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,EUR ASSOC FISH PATHOLOGISTS,NA +bulletin of the geological society of denmark,2245-7070,2245-7070,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,GEOLOGICAL SOC DENMARK,NA +bulletin of the geological society of finland,0367-5211,1799-4632,NA,0,0,1,0,Geology,NA,NA,GEOLOGICAL SOC FINLAND,NA +bulletin of the history of medicine,0007-5140,1086-3176,BHMjournal,1,1,1,1,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,JOHNS HOPKINS UNIV PRESS,2017-02-02 +bulletin of the history of medicine,0007-5140,1086-3176,BHMjournal,1,1,1,1,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,JOHNS HOPKINS UNIV PRESS,2017-02-02 +bulletin of the history of medicine,0007-5140,1086-3176,BHMjournal,1,1,1,1,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,JOHNS HOPKINS UNIV PRESS,2017-02-02 +bulletin of the institute of classical studies,0076-0730,2041-5370,NA,1,0,0,0,NA,NA,Classics,OXFORD UNIV PRESS,NA +bulletin of the institute of history and philology academia sinica,1012-4195,NA,NA,1,0,0,0,NA,NA,History | Language & Linguistics | Asian Studies,ACAD SINICA-INST HISTORY PHILOLOGY,NA +bulletin of the iranian mathematical society,1017-060X,1735-8515,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER SINGAPORE PTE LTD,NA +bulletin of the korean chemical society,0253-2964,1229-5949,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +bulletin of the korean mathematical society,1015-8634,1015-8634,NA,0,0,1,0,Mathematics,NA,NA,KOREAN MATHEMATICAL SOC,NA +bulletin of the lebedev physics institute,1068-3356,1934-838X,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,PLEIADES PUBLISHING INC,NA +bulletin of the london mathematical society,0024-6093,1469-2120,NA,0,0,1,0,Mathematics,NA,NA,WILEY,NA +bulletin of the malaysian mathematical sciences society,0126-6705,2180-4206,NA,0,0,1,0,Mathematics,NA,NA,SPRINGERNATURE,NA +bulletin of the menninger clinic,0025-9284,1943-2828,NA,0,1,0,0,NA,"Psychiatry | Psychology, Psychoanalysis",NA,GUILFORD PUBLICATIONS INC,NA +bulletin of the peabody museum of natural history,0079-032X,2162-4135,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,PEABODY MUSEUM NATURAL HISTORY-YALE UNIV,NA +bulletin of the polish academy of sciences-technical sciences,0239-7528,2300-1917,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCI, DIV IV TECHNICAL SCIENCES PAS",NA +bulletin of the school of oriental and african studies-university of london,0041-977X,1474-0699,BulletinOfSOAS,1,0,0,1,NA,NA,Asian Studies,CAMBRIDGE UNIV PRESS,2017-06-19 +bulletin of the seismological society of america,0037-1106,1943-3573,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SEISMOLOGICAL SOC AMER,NA +bulletin of the world health organization,0042-9686,1564-0604,WHOBulletin,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,WORLD HEALTH ORGANIZATION,2011-01-14 +bulletin of volcanology,0258-8900,1432-0819,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +bulleton of the john rylands library,2054-9318,2054-9326,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",MANCHESTER UNIV PRESS,NA +bundesgesundheitsblatt-gesundheitsforschung-gesundheitsschutz,1436-9990,1437-1588,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,SPRINGER,NA +bunseki kagaku,0525-1931,NA,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,JAPAN SOC ANALYTICAL CHEMISTRY,NA +burlington magazine,0007-6287,2044-9925,BurlingtonMag,1,0,0,1,NA,NA,Art,BURLINGTON MAG PUBL LTD,2009-10-13 +burns,0305-4179,1879-1409,NA,0,0,1,0,Critical Care Medicine | Dermatology | Surgery,NA,NA,ELSEVIER SCI LTD,NA +burns & trauma,2321-3868,2321-3876,burns_trauma,0,0,1,1,Emergency Medicine | Dermatology | Surgery,NA,NA,OXFORD UNIV PRESS,2016-12-14 +business & information systems engineering,2363-7005,1867-0202,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,SPRINGER VIEWEG-SPRINGER FACHMEDIEN WIESBADEN GMBH,NA +business & society,0007-6503,1552-4205,BASeditors,0,1,0,1,NA,Business,NA,SAGE PUBLICATIONS INC,2015-01-31 +business and politics,1369-5258,1469-3569,bap_journal,0,1,0,1,NA,Political Science | International Relations,NA,CAMBRIDGE UNIV PRESS,2011-04-29 +business ethics quarterly,1052-150X,2153-3326,BEQJournal,0,1,0,1,NA,Business | Ethics,NA,CAMBRIDGE UNIV PRESS,2015-03-23 +business ethics the environment & responsibility,2694-6416,2694-6424,Beer_Wiley,0,1,0,1,NA,Business | Ethics,NA,WILEY,2021-03-25 +business history,0007-6791,1743-7938,NA,0,1,0,0,NA,Business | History Of Social Sciences,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +business history review,0007-6805,2044-768X,NA,0,1,0,0,NA,Business | History Of Social Sciences,NA,CAMBRIDGE UNIV PRESS,NA +business horizons,0007-6813,1873-6068,BizHorizons,0,1,0,1,NA,Business,NA,ELSEVIER,2012-09-04 +business process management journal,1463-7154,1758-4116,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +business strategy and the environment,0964-4733,1099-0836,NA,0,1,0,0,NA,Business | Environmental Studies | Management,NA,WILEY,NA +byu studies quarterly,2167-8472,2167-8480,BYUStudies,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",BRIGHAM YOUNG UNIV,2009-03-07 +byzantine and modern greek studies,0307-0131,1749-625X,BMGSjournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",CAMBRIDGE UNIV PRESS,2022-03-22 +byzantinische zeitschrift,0007-7704,1868-9027,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,WALTER DE GRUYTER GMBH,NA +ca-a cancer journal for clinicians,0007-9235,1542-4863,CAonline,0,0,1,1,Oncology,NA,NA,WILEY,2009-01-16 +cadernos de saude publica,0102-311X,1678-4464,CadernosSP,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,CADERNOS SAUDE PUBLICA,2013-08-07 +cadernos de saude publica,0102-311X,1678-4464,CadernosSP,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,CADERNOS SAUDE PUBLICA,2013-08-07 +cadmo,1122-5165,1972-5019,NA,0,1,0,0,NA,Education & Educational Research,NA,FRANCO ANGELI,NA +cahiers agricultures,1166-7699,1777-5949,CAgricultures,0,0,1,1,"Agriculture, Multidisciplinary | Agronomy",NA,NA,EDP SCIENCES S A,2013-11-04 +cahiers de biologie marine,0007-9723,2262-3094,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,CAHIERS DE BIOLOGIE MARINE,NA +cahiers de civilisation medievale,0007-9731,2119-1026,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,CENTRE ETUD SUPERIEUR CIV MED,NA +cahiers du monde russe,1252-6576,1777-5388,NA,1,0,0,0,NA,NA,History,EDITIONS ECOLE HAUTESETUDES & SCIENCES SOCIALES,NA +cahiers elisabethains,0184-7678,2054-4715,CahiersE,1,0,0,1,NA,NA,"Literature, British Isles",UNIV MONTPELLIER,2020-09-21 +cahiers victoriens & edouardiens,0220-5610,2271-6149,NA,1,0,0,0,NA,NA,"Literature, British Isles",UNIV MONTPELLIER,NA +calcified tissue international,0171-967X,1432-0827,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER,NA +calcolo,0008-0624,1126-5434,calcolojournal,0,0,1,1,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER-VERLAG ITALIA SRL,2018-06-14 +calculus of variations and partial differential equations,0944-2669,1432-0835,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER HEIDELBERG,NA +caldasia,0366-5232,2357-3759,CaldasiaICN_UN,0,0,1,1,Plant Sciences | Zoology,NA,NA,"INST CIENCIAS NATURALES, MUSEO HISTORIA NATURAL",2019-02-27 +california agriculture,0008-0845,2160-8091,Cal_Ag,0,0,1,1,"Agriculture, Multidisciplinary",NA,NA,"UNIV CALIFORNIA, OAKLAND, DIVISION AGRICULTURE & NATURAL RESOURCES",2011-02-05 +california cooperative oceanic fisheries investigations reports,0575-3317,0575-3317,NA,0,0,1,0,Fisheries,NA,NA,SCRIPPS INST OCEANOGRAPHY,NA +california fish and game,0008-1078,2331-0405,NA,0,0,1,0,Fisheries | Zoology,NA,NA,CALIFORNIA FISH AND GAME EDITOR,NA +california history,0162-2897,2327-1485,NA,1,0,0,0,NA,NA,History,CALIFORNIA HISTORICAL SOC,NA +california law review,0008-1221,1942-6542,CalifLRev,0,1,0,1,NA,Law,NA,"UNIV CALIFORNIA, BERKELEY SCH LAW",2010-01-26 +california management review,0008-1256,2162-8564,NA,0,1,0,0,NA,Business | Management,NA,SAGE PUBLICATIONS INC,NA +callaloo,0161-2492,1080-6512,CallalooJournal,1,0,0,1,NA,NA,"Literature, African, Australian, Canadian",JOHNS HOPKINS UNIV PRESS,2009-11-03 +calphad-computer coupling of phase diagrams and thermochemistry,0364-5916,1873-2984,NA,0,0,1,0,"Thermodynamics | Chemistry, Physical | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +cambrian medieval celtic studies,1353-0089,1353-0089,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,"CMCS, DEPT WELSH",NA +cambridge archaeological journal,0959-7743,1474-0540,NA,1,0,0,0,NA,NA,Archaeology,CAMBRIDGE UNIV PRESS,NA +cambridge classical journal,1750-2705,2047-993X,NA,1,0,0,0,NA,NA,Classics,CAMBRIDGE UNIV PRESS,NA +cambridge journal of economics,0309-166X,1464-3545,NA,0,1,0,0,NA,Economics,NA,OXFORD UNIV PRESS,NA +cambridge journal of education,0305-764X,1469-3577,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cambridge journal of mathematics,2168-0930,2168-0949,NA,0,0,1,0,Mathematics,NA,NA,"INT PRESS BOSTON, INC",NA +cambridge journal of postcolonial literary inquiry,2052-2614,2052-2622,NA,1,0,0,0,NA,NA,Literature | Literary Theory & Criticism,CAMBRIDGE UNIV PRESS,NA +cambridge journal of regions economy and society,1752-1378,1752-1386,CamJRES,0,1,0,1,NA,Development Studies | Economics | Geography,NA,OXFORD UNIV PRESS,2013-06-20 +cambridge law journal,0008-1973,1469-2139,NA,0,1,0,0,NA,Law,NA,CAMBRIDGE UNIV PRESS,NA +cambridge opera journal,0954-5867,1474-0621,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +cambridge quarterly,0008-199X,1471-6836,NA,1,0,0,0,NA,NA,Literary Theory & Criticism | Literature,OXFORD UNIV PRESS,NA +cambridge quarterly of healthcare ethics,0963-1801,1469-2147,NA,0,1,1,0,Health Care Sciences & Services,"Health Policy & Services | Social Sciences, Biomedical",NA,CAMBRIDGE UNIV PRESS,NA +cambridge quarterly of healthcare ethics,0963-1801,1469-2147,NA,0,1,1,0,Health Care Sciences & Services,"Health Policy & Services | Social Sciences, Biomedical",NA,CAMBRIDGE UNIV PRESS,NA +cambridge review of international affairs,0955-7571,1474-449X,CambridgeCRIA,0,1,0,1,NA,International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-10-20 +camera obscura,0270-5346,1529-1510,Camera_Obscura,1,0,0,1,NA,NA,"Film, Radio, Television",DUKE UNIV PRESS,2009-12-23 +canadian association of radiologists journal-journal de l association canadienne des radiologistes,0846-5371,1488-2361,CanRadJournal,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SAGE PUBLICATIONS INC,2020-07-13 +canadian entomologist,0008-347X,1918-3240,NA,0,0,1,0,Entomology,NA,NA,CAMBRIDGE UNIV PRESS,NA +canadian family physician,0008-350X,1715-5258,CFPJournal,0,0,1,1,"Primary Health Care | Medicine, General & Internal",NA,NA,COLL FAMILY PHYSICIANS CANADA,2010-04-27 +canadian geographer-geographe canadien,0008-3658,1541-0064,NA,0,1,0,0,NA,Geography,NA,WILEY,NA +canadian geotechnical journal,0008-3674,1208-6010,CanGeotechJ,0,0,1,1,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,CANADIAN SCIENCE PUBLISHING,2014-03-18 +canadian historical review,0008-3755,1710-1093,CanHistReview,1,1,0,1,NA,History,History,UNIV TORONTO PRESS INC,2018-01-30 +canadian historical review,0008-3755,1710-1093,CanHistReview,1,1,0,1,NA,History,History,UNIV TORONTO PRESS INC,2018-01-30 +canadian journal of administrative sciences-revue canadienne des sciences de l administration,0825-0383,1936-4490,NA,0,1,0,0,NA,Business | Management,NA,WILEY,NA +canadian journal of agricultural economics-revue canadienne d agroeconomie,0008-3976,1744-7976,CJAE_CAES,0,1,1,1,Agricultural Economics & Policy,Economics,NA,WILEY,2020-04-03 +canadian journal of agricultural economics-revue canadienne d agroeconomie,0008-3976,1744-7976,CJAE_CAES,0,1,1,1,Agricultural Economics & Policy,Economics,NA,WILEY,2020-04-03 +canadian journal of anesthesia-journal canadien d anesthesie,0832-610X,1496-8975,CJA_Journal,0,0,1,1,Anesthesiology,NA,NA,SPRINGER,2013-11-10 +canadian journal of animal science,0008-3984,1918-1825,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of behavioural science-revue canadienne des sciences du comportement,0008-400X,1879-2669,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,CANADIAN PSYCHOLOGICAL ASSOC,NA +canadian journal of cardiology,0828-282X,1916-7075,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCIENCE INC,NA +canadian journal of chemical engineering,0008-4034,1939-019X,CanJChemEng,0,0,1,1,"Engineering, Chemical",NA,NA,WILEY,2016-05-05 +canadian journal of chemistry,0008-4042,1480-3291,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of civil engineering,0315-1468,1208-6029,NA,0,0,1,0,"Engineering, Civil",NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of criminology and criminal justice,1707-7753,1911-0219,NA,0,1,0,0,NA,Criminology & Penology,NA,UNIV TORONTO PRESS INC,NA +canadian journal of development studies-revue canadienne d etudes du developpement,0225-5189,2158-9100,CanDevStudies,0,1,0,1,NA,Development Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-09-22 +canadian journal of diabetes,1499-2671,2352-3840,CanJDiabetes,0,0,1,1,Endocrinology & Metabolism,NA,NA,ELSEVIER,2020-12-18 +canadian journal of dietetic practice and research,1486-3847,2292-9592,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,DIETITIANS CANADA,NA +canadian journal of earth sciences,0008-4077,1480-3313,CanJEarthSci,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,CANADIAN SCIENCE PUBLISHING,2014-06-25 +canadian journal of economics-revue canadienne d economique,0008-4085,1540-5982,CanJEcon,0,1,0,1,NA,Economics,NA,WILEY,2021-05-04 +canadian journal of emergency medicine,1481-8035,1481-8043,CJEMonline,0,0,1,1,Emergency Medicine,NA,NA,SPRINGER HEIDELBERG,2013-06-19 +canadian journal of experimental psychology-revue canadienne de psychologie experimentale,1196-1961,1878-7290,CanJournExpPsyc,0,1,0,1,NA,"Psychology, Experimental",NA,CANADIAN PSYCHOLOGICAL ASSOC,2018-08-09 +canadian journal of film studies-revue canadienne d etudes cinematographiques,0847-5911,2561-424X,NA,1,0,0,0,NA,NA,"Film, Radio, Television",UNIV TORONTO PRESS INC,NA +canadian journal of fisheries and aquatic sciences,0706-652X,1205-7533,cjfas,0,0,1,1,Fisheries | Marine & Freshwater Biology,NA,NA,CANADIAN SCIENCE PUBLISHING,2014-12-19 +canadian journal of forest research,0045-5067,1208-6037,NA,0,0,1,0,Forestry,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of gastroenterology and hepatology,2291-2789,2291-2797,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,HINDAWI LTD,NA +canadian journal of infectious diseases & medical microbiology,1712-9532,1918-1493,NA,0,0,1,0,Infectious Diseases | Microbiology,NA,NA,HINDAWI LTD,NA +canadian journal of information and library science-revue canadienne des sciences de l information et de bibliotheconomie,1195-096X,1920-7239,NA,0,1,0,0,NA,Information Science & Library Science,NA,WESTERN LIBRARIES,NA +canadian journal of linguistics-revue canadienne de linguistique,0008-4131,1710-1115,NA,1,0,0,0,NA,NA,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +canadian journal of mathematics-journal canadien de mathematiques,0008-414X,1496-4279,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +canadian journal of microbiology,0008-4166,1480-3275,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of neurological sciences,0317-1671,2057-0155,JournalCJNS,0,0,1,1,Clinical Neurology,NA,NA,CAMBRIDGE UNIV PRESS,2021-11-02 +canadian journal of occupational therapy-revue canadienne d ergotherapie,0008-4174,1911-9828,NA,0,1,1,0,Rehabilitation,Rehabilitation,NA,SAGE PUBLICATIONS INC,NA +canadian journal of occupational therapy-revue canadienne d ergotherapie,0008-4174,1911-9828,NA,0,1,1,0,Rehabilitation,Rehabilitation,NA,SAGE PUBLICATIONS INC,NA +canadian journal of ophthalmology-journal canadien d ophtalmologie,0008-4182,1715-3360,NA,0,0,1,0,Ophthalmology,NA,NA,CANADIAN OPHTHAL SOC,NA +canadian journal of philosophy,0045-5091,1911-0820,CJPhilos,1,0,0,1,NA,NA,Philosophy,CAMBRIDGE UNIV PRESS,2014-09-30 +canadian journal of physics,0008-4204,1208-6045,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of physiology and pharmacology,0008-4212,1205-7541,NA,0,0,1,0,Pharmacology & Pharmacy | Physiology,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of plant pathology,0706-0661,1715-2992,CJPP_CPS,0,0,1,1,Plant Sciences,NA,NA,TAYLOR & FRANCIS INC,2020-04-22 +canadian journal of plant science,0008-4220,1918-1833,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of political science-revue canadienne de science politique,0008-4239,1744-9324,CJPS_RCSP,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2017-06-26 +canadian journal of psychiatry-revue canadienne de psychiatrie,0706-7437,1497-0015,TheCJPsych,0,1,1,1,Psychiatry,Psychiatry,NA,SAGE PUBLICATIONS INC,2020-02-15 +canadian journal of psychiatry-revue canadienne de psychiatrie,0706-7437,1497-0015,TheCJPsych,0,1,1,1,Psychiatry,Psychiatry,NA,SAGE PUBLICATIONS INC,2020-02-15 +canadian journal of public health-revue canadienne de sante publique,0008-4263,1920-7476,CJPH_RCSP,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,SPRINGER INT PUBL AG,2016-03-31 +canadian journal of remote sensing,0703-8992,1712-7971,NA,0,0,1,0,Remote Sensing,NA,NA,TAYLOR & FRANCIS INC,NA +canadian journal of school psychology,0829-5735,2154-3984,CanadianJSP,0,1,0,1,NA,"Psychology, Educational",NA,SAGE PUBLICATIONS INC,2018-01-01 +canadian journal of sociology-cahiers canadiens de sociologie,0318-6431,0318-6431,CanJSociology,0,1,0,1,NA,Sociology,NA,UNIV ALBERTA,2014-03-04 +canadian journal of soil science,0008-4271,1918-1841,NA,0,0,1,0,Soil Science,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal of statistics-revue canadienne de statistique,0319-5724,1708-945X,NA,0,0,1,0,Statistics & Probability,NA,NA,WILEY,NA +canadian journal of surgery,0008-428X,1488-2310,NA,0,0,1,0,Surgery,NA,NA,CMA-CANADIAN MEDICAL ASSOC,NA +canadian journal of urology,1195-9479,NA,canjurol,0,0,1,1,Urology & Nephrology,NA,NA,CANADIAN J UROLOGY,2012-05-24 +canadian journal of veterinary research-revue canadienne de recherche veterinaire,0830-9000,1928-9022,NA,0,0,1,0,Veterinary Sciences,NA,NA,CANADIAN VET MED ASSOC,NA +canadian journal of zoology,0008-4301,1480-3283,NA,0,0,1,0,Zoology,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +canadian journal on aging-revue canadienne du vieillissement,0714-9808,1710-1107,NA,0,1,0,0,NA,Gerontology,NA,CAMBRIDGE UNIV PRESS,NA +canadian literature,0008-4360,0008-4360,canadianlit,1,0,0,1,NA,NA,"Literature, African, Australian, Canadian",UNIV BRITISH COLUMBIA,2009-04-16 +canadian mathematical bulletin-bulletin canadien de mathematiques,0008-4395,1496-4287,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +canadian medical association journal,0820-3946,1488-2329,CMAJ,0,0,1,1,"Medicine, General & Internal",NA,NA,CMA-CANADIAN MEDICAL ASSOC,2009-02-12 +canadian metallurgical quarterly,0008-4433,1879-1395,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,TAYLOR & FRANCIS LTD,NA +canadian mineralogist,0008-4476,1499-1276,NA,0,0,1,0,Mineralogy,NA,NA,MINERALOGICAL ASSOC CANADA,NA +canadian modern language review-revue canadienne des langues vivantes,0008-4506,1710-1131,NA,0,1,0,0,NA,Linguistics,NA,CANADIAN MODERN LANGUAGE REV,NA +canadian poetry,0704-5646,NA,NA,1,0,0,0,NA,NA,Poetry,"UNIV W ONTARIO, ENGLISH DEPT",NA +canadian psychology-psychologie canadienne,0708-5591,1878-7304,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,CANADIAN PSYCHOLOGICAL ASSOC,NA +canadian public administration-administration publique du canada,0008-4840,1754-7121,CdnPublicAdm,0,1,0,1,NA,Public Administration,NA,WILEY,2014-06-04 +canadian public policy-analyse de politiques,0317-0861,1911-9917,NA,0,1,0,0,NA,Economics | Public Administration,NA,UNIV TORONTO PRESS INC,NA +canadian respiratory journal,1198-2241,1916-7245,NA,0,0,1,0,Respiratory System,NA,NA,HINDAWI LTD,NA +canadian review of american studies,0007-7720,1710-114X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV TORONTO PRESS INC,NA +canadian review of sociology-revue canadienne de sociologie,1755-6171,1755-618X,CRS_RCS,0,1,0,1,NA,Sociology,NA,WILEY,2016-06-15 +canadian studies in population,0380-1489,1927-629X,NA,0,1,0,0,NA,Demography,NA,SPRINGER,NA +canadian theatre review,0315-0836,1920-941X,CanTheatreRev,1,0,0,1,NA,NA,Theater,UNIV TORONTO PRESS INC,2015-11-12 +canadian veterinary journal-revue veterinaire canadienne,0008-5286,0008-5286,NA,0,0,1,0,Veterinary Sciences,NA,NA,CANADIAN VET MED ASSOC,NA +canadian water resources journal,0701-1784,1918-1817,NA,0,0,1,0,Water Resources,NA,NA,TAYLOR & FRANCIS INC,NA +cancer,0008-543X,1097-0142,JournalCancer,0,0,1,1,Oncology,NA,NA,WILEY,2009-01-16 +cancer & metabolism,2049-3002,2049-3002,NA,0,0,1,0,Oncology | Cell Biology,NA,NA,BMC,NA +cancer and metastasis reviews,0167-7659,1573-7233,NA,0,0,1,0,Oncology,NA,NA,SPRINGER,NA +cancer biology & medicine,2095-3941,NA,NA,0,0,1,0,"Oncology | Medicine, Research & Experimental",NA,NA,CHINA ANTI-CANCER ASSOC,NA +cancer biology & therapy,1538-4047,1555-8576,CancerBiologyTx,0,0,1,1,Oncology,NA,NA,TAYLOR & FRANCIS INC,2021-11-04 +cancer biomarkers,1574-0153,1875-8592,NA,0,0,1,0,Oncology,NA,NA,IOS PRESS,NA +cancer biotherapy and radiopharmaceuticals,1084-9785,1557-8852,NA,0,0,1,0,"Oncology | Medicine, Research & Experimental | Pharmacology & Pharmacy | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,"MARY ANN LIEBERT, INC",NA +cancer causes & control,0957-5243,1573-7225,NA,0,0,1,0,"Oncology | Public, Environmental & Occupational Health",NA,NA,SPRINGER,NA +cancer cell,1535-6108,1878-3686,Cancer_Cell,0,0,1,1,Oncology | Cell Biology,NA,NA,CELL PRESS,2012-05-14 +cancer cell international,1475-2867,1475-2867,NA,0,0,1,0,Oncology,NA,NA,BMC,NA +cancer chemotherapy and pharmacology,0344-5704,1432-0843,NA,0,0,1,0,Oncology | Pharmacology & Pharmacy,NA,NA,SPRINGER,NA +cancer communications,2523-3548,2523-3548,NA,0,0,1,0,Oncology,NA,NA,WILEY,NA +cancer control,1073-2748,1073-2748,NA,0,0,1,0,Oncology,NA,NA,SAGE PUBLICATIONS INC,NA +cancer cytopathology,1934-662X,1934-6638,CancerCytopath,0,0,1,1,Oncology | Pathology,NA,NA,WILEY,2012-10-11 +cancer discovery,2159-8274,2159-8290,CD_AACR,0,0,1,1,Oncology,NA,NA,AMER ASSOC CANCER RESEARCH,2018-07-23 +cancer epidemiology,1877-7821,1877-783X,CancerEpid,0,0,1,1,"Oncology | Public, Environmental & Occupational Health",NA,NA,ELSEVIER SCI LTD,2021-07-21 +cancer epidemiology biomarkers & prevention,1055-9965,1538-7755,CEBP_AACR,0,0,1,1,"Oncology | Public, Environmental & Occupational Health",NA,NA,AMER ASSOC CANCER RESEARCH,2018-07-23 +cancer gene therapy,0929-1903,1476-5500,cgtnature,0,0,1,1,"Biotechnology & Applied Microbiology | Oncology | Genetics & Heredity | Medicine, Research & Experimental",NA,NA,SPRINGERNATURE,2013-11-06 +cancer genetics,2210-7762,2210-7770,NA,0,0,1,0,Oncology | Genetics & Heredity,NA,NA,ELSEVIER SCIENCE INC,NA +cancer genomics & proteomics,1109-6535,1790-6245,NA,0,0,1,0,Oncology | Genetics & Heredity,NA,NA,INT INST ANTICANCER RESEARCH,NA +cancer imaging,1740-5025,1470-7330,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,BMC,NA +cancer immunology immunotherapy,0340-7004,1432-0851,NA,0,0,1,0,Oncology | Immunology,NA,NA,SPRINGER,NA +cancer immunology research,2326-6066,2326-6074,CIR_AACR,0,0,1,1,Oncology | Immunology,NA,NA,AMER ASSOC CANCER RESEARCH,2018-07-24 +cancer investigation,0735-7907,1532-4192,NA,0,0,1,0,Oncology,NA,NA,TAYLOR & FRANCIS INC,NA +cancer journal,1528-9117,1540-336X,NA,0,0,1,0,Oncology,NA,NA,ASSOC DEVELOPPEMENT COMMUNICATION CANCEROLOGIQUE,NA +cancer letters,0304-3835,1872-7980,NA,0,0,1,0,Oncology,NA,NA,ELSEVIER IRELAND LTD,NA +cancer management and research,1179-1322,1179-1322,NA,0,0,1,0,Oncology,NA,NA,DOVE MEDICAL PRESS LTD,NA +cancer medicine,2045-7634,2045-7634,NA,0,0,1,0,Oncology,NA,NA,WILEY,NA +cancer nanotechnology,1868-6958,1868-6966,CancerNanotech,0,0,1,1,Oncology | Nanoscience & Nanotechnology,NA,NA,BMC,2015-02-18 +cancer nursing,0162-220X,1538-9804,Cancer_Nursing,0,1,1,1,Oncology | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-01-12 +cancer nursing,0162-220X,1538-9804,Cancer_Nursing,0,1,1,1,Oncology | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-01-12 +cancer prevention research,1940-6207,1940-6215,CAPR_AACR,0,0,1,1,Oncology,NA,NA,AMER ASSOC CANCER RESEARCH,2018-07-24 +cancer radiotherapie,1278-3218,1769-6658,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER,NA +cancer research,0008-5472,1538-7445,NA,0,0,1,0,Oncology,NA,NA,AMER ASSOC CANCER RESEARCH,NA +cancer research and treatment,1598-2998,2005-9256,NA,0,0,1,0,Oncology,NA,NA,KOREAN CANCER ASSOCIATION,NA +cancer science,1347-9032,1349-7006,NA,0,0,1,0,Oncology,NA,NA,WILEY,NA +cancer treatment reviews,0305-7372,1532-1967,NA,0,0,1,0,Oncology,NA,NA,ELSEVIER SCI LTD,NA +cancers,2072-6694,2072-6694,Cancers_MDPI,0,0,1,1,Oncology,NA,NA,MDPI,2016-03-24 +candollea,0373-2967,NA,NA,0,0,1,0,Plant Sciences,NA,NA,CONSERVATOIRE ET JARDIN BOTANIQUES VILLE GENEVE,NA +cannabis and cannabinoid research,2578-5125,2378-8763,CannabisJrnl,0,0,1,1,Pharmacology & Pharmacy,NA,NA,"MARY ANN LIEBERT, INC",2015-06-23 +caravelle,1147-6753,2272-9828,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",PRESSES UNIV MIDI-PUM,NA +carbohydrate polymers,0144-8617,1879-1344,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Organic | Polymer Science",NA,NA,ELSEVIER SCI LTD,NA +carbohydrate research,0008-6215,1873-426X,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Applied | Chemistry, Organic",NA,NA,ELSEVIER SCI LTD,NA +carbon,0008-6223,1873-3891,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +carbon balance and management,1750-0680,1750-0680,NA,0,0,1,0,Environmental Sciences,NA,NA,BMC,NA +carbon letters,1976-4251,2233-4998,NA,0,0,1,0,"Chemistry, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,SPRINGER JAPAN KK,NA +carbon management,1758-3004,1758-3012,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,TAYLOR & FRANCIS LTD,NA +carbon management,1758-3004,1758-3012,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,TAYLOR & FRANCIS LTD,NA +carbonates and evaporites,0891-2556,1878-5212,NA,0,0,1,0,Geology,NA,NA,SPRINGER,NA +carcinogenesis,0143-3334,1460-2180,NA,0,0,1,0,Oncology,NA,NA,OXFORD UNIV PRESS,NA +cardiology,0008-6312,1421-9751,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,KARGER,NA +cardiology clinics,0733-8651,1558-2264,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +cardiology in review,1061-5377,1538-4683,CIRonlinejrl,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-28 +cardiology in the young,1047-9511,1467-1107,CardiologyYoung,0,0,1,1,Cardiac & Cardiovascular System | Pediatrics,NA,NA,CAMBRIDGE UNIV PRESS,2020-01-04 +cardiology journal,1897-5593,1898-018X,CardiologyJour1,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,VIA MEDICA,2020-08-06 +cardiology research and practice,2090-8016,2090-0597,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,HINDAWI LTD,NA +cardiorenal medicine,1664-3828,1664-5502,NA,0,0,1,0,Cardiac & Cardiovascular System | Urology & Nephrology,NA,NA,KARGER,NA +cardiovascular and interventional radiology,0174-1551,1432-086X,NA,0,0,1,0,"Cardiac & Cardiovascular System | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +cardiovascular diabetology,1475-2840,1475-2840,NA,0,0,1,0,Cardiac & Cardiovascular System | Endocrinology & Metabolism,NA,NA,BMC,NA +cardiovascular diagnosis and therapy,2223-3652,2223-3660,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,AME PUBL CO,NA +cardiovascular drugs and therapy,0920-3206,1573-7241,NA,0,0,1,0,Cardiac & Cardiovascular System | Pharmacology & Pharmacy,NA,NA,SPRINGER,NA +cardiovascular engineering and technology,1869-408X,1869-4098,NA,0,0,1,0,"Cardiac & Cardiovascular System | Engineering, Biomedical",NA,NA,SPRINGER,NA +cardiovascular journal of africa,1995-1892,1680-0745,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,CLINICS CARDIVE PUBL PTY LTD,NA +cardiovascular pathology,1054-8807,1879-1336,CVpathol,0,0,1,1,Cardiac & Cardiovascular System | Pathology,NA,NA,ELSEVIER SCIENCE INC,2018-10-03 +cardiovascular research,0008-6363,1755-3245,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,OXFORD UNIV PRESS,NA +cardiovascular therapeutics,1755-5914,1755-5922,NA,0,0,1,0,Cardiac & Cardiovascular System | Pharmacology & Pharmacy,NA,NA,WILEY-HINDAWI,NA +cardiovascular toxicology,1530-7905,1559-0259,NA,0,0,1,0,Cardiac & Cardiovascular System | Toxicology,NA,NA,HUMANA PRESS INC,NA +cardiovascular ultrasound,1476-7120,1476-7120,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,BMC,NA +career development and transition for exceptional individuals,2165-1434,2165-1442,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SAGE PUBLICATIONS INC,NA +career development international,1362-0436,1758-6003,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,EMERALD GROUP PUBLISHING LTD,NA +career development quarterly,0889-4019,2161-0045,NA,0,1,0,0,NA,"Psychology, Applied",NA,WILEY,NA +caribbean journal of science,0008-6452,0008-6452,NA,0,0,1,0,Biodiversity Conservation,NA,NA,"UNIV PUERTO RICO,",NA +caries research,0008-6568,1421-976X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,KARGER,NA +carnets de geologie,1634-0744,1765-2553,NA,0,0,1,0,Geology | Paleontology,NA,NA,CARNETS GEOLOGIE,NA +carpathian journal of earth and environmental sciences,1842-4090,1844-489X,NA,0,0,1,0,Environmental Sciences,NA,NA,NORTH UNIV BAIA MARE,NA +carpathian journal of mathematics,1584-2851,1843-4401,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,NORTH UNIV BAIA MARE,NA +cartilage,1947-6035,1947-6043,NA,0,0,1,0,Orthopedics,NA,NA,SAGE PUBLICATIONS INC,NA +cartographic journal,0008-7041,1743-2774,CartoJnl,0,1,0,1,NA,Geography,NA,TAYLOR & FRANCIS LTD,2010-10-26 +cartography and geographic information science,1523-0406,1545-0465,NA,0,1,0,0,NA,Geography,NA,TAYLOR & FRANCIS INC,NA +caryologia,0008-7114,2165-5391,NA,0,0,1,0,Plant Sciences | Genetics & Heredity,NA,NA,FIRENZE UNIV PRESS,NA +case studies in construction materials,2214-5095,2214-5095,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +case studies in thermal engineering,2214-157X,2214-157X,NA,0,0,1,0,Thermodynamics,NA,NA,ELSEVIER,NA +castanea,0008-7475,1938-4386,NA,0,0,1,0,Plant Sciences,NA,NA,"SOUTHERN APPALACHIAN BOTANICAL SOC, NEWBERRY COLL",NA +catalysis communications,1566-7367,1873-3905,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER,NA +catalysis letters,1011-372X,1572-879X,NA,0,0,1,0,"Chemistry, Physical",NA,NA,SPRINGER,NA +catalysis reviews-science and engineering,0161-4940,1520-5703,NA,0,0,1,0,"Chemistry, Physical",NA,NA,TAYLOR & FRANCIS INC,NA +catalysis science & technology,2044-4753,2044-4761,CatalysisSciTec,0,0,1,1,"Chemistry, Physical",NA,NA,ROYAL SOC CHEMISTRY,2010-08-06 +catalysis surveys from asia,1571-1013,1574-9266,NA,0,0,1,0,"Chemistry, Physical",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +catalysis today,0920-5861,1873-4308,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Engineering, Chemical",NA,NA,ELSEVIER,NA +catalysts,2073-4344,2073-4344,Catalysts_MDPI,0,0,1,1,"Chemistry, Physical",NA,NA,MDPI,2015-12-11 +catena,0341-8162,1872-6887,NA,0,0,1,0,"Geosciences, Multidisciplinary | Soil Science | Water Resources",NA,NA,ELSEVIER,NA +catheterization and cardiovascular interventions,1522-1946,1522-726X,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,WILEY,NA +catholic biblical quarterly,0008-7912,2163-2529,NA,1,0,0,0,NA,NA,Religion,CATHOLIC BIBLICAL ASSOC AMER,NA +catholic historical review,0008-8080,1534-0708,catholic_review,1,0,0,1,NA,NA,History,CATHOLIC UNIV AMER PRESS,2022-02-18 +catholic university law review,0008-8390,0008-8390,NA,0,1,0,0,NA,Law,NA,CATHOLIC UNIV AMER PRESS,NA +cattle practice,0969-1251,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,BRITISH CATTLE VETERINARY ASSOC,NA +cbe-life sciences education,1931-7913,1931-7913,CBELifescied,0,0,1,1,"Education, Scientific Disciplines",NA,NA,AMER SOC CELL BIOLOGY,2015-09-04 +cea critic,0007-8069,2327-5898,CEA_Critic,1,0,0,1,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,2012-01-24 +celebrity studies,1939-2397,1939-2400,CSJcelebstudies,1,1,0,1,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-05-31 +celebrity studies,1939-2397,1939-2400,CSJcelebstudies,1,1,0,1,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-05-31 +celestial mechanics & dynamical astronomy,0923-2958,1572-9478,NA,0,0,1,0,"Astronomy & Astrophysics | Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER,NA +cell,0092-8674,1097-4172,CellCellPress,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,CELL PRESS,2009-08-12 +cell adhesion & migration,1933-6918,1933-6926,NA,0,0,1,0,Cell Biology,NA,NA,TAYLOR & FRANCIS INC,NA +cell and bioscience,2045-3701,2045-3701,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,BMC,NA +cell and tissue banking,1389-9333,1573-6814,NA,0,0,1,0,"Cell Biology | Engineering, Biomedical",NA,NA,SPRINGER,NA +cell and tissue research,0302-766X,1432-0878,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGER,NA +cell biochemistry and biophysics,1085-9195,1559-0283,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics | Cell Biology,NA,NA,HUMANA PRESS INC,NA +cell biochemistry and function,0263-6484,1099-0844,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,WILEY,NA +cell biology and toxicology,0742-2091,1573-6822,NA,0,0,1,0,Cell Biology | Toxicology,NA,NA,SPRINGER,NA +cell biology international,1065-6995,1095-8355,NA,0,0,1,0,Cell Biology,NA,NA,WILEY,NA +cell calcium,0143-4160,1532-1991,NA,0,0,1,0,Cell Biology,NA,NA,ELSEVIER SCI LTD,NA +cell chemical biology,2451-9448,2451-9448,CellChemBiol,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,CELL PRESS,2014-04-25 +cell communication and signaling,1478-811X,1478-811X,NA,0,0,1,0,Cell Biology,NA,NA,BMC,NA +cell cycle,1538-4101,1551-4005,NA,0,0,1,0,Cell Biology,NA,NA,TAYLOR & FRANCIS INC,NA +cell death & disease,2041-4889,2041-4889,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGERNATURE,NA +cell death and differentiation,1350-9047,1476-5403,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,SPRINGERNATURE,NA +cell death discovery,NA,2058-7716,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGERNATURE,NA +cell discovery,2056-5968,2056-5968,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGERNATURE,NA +cell division,1747-1028,1747-1028,NA,0,0,1,0,Cell Biology,NA,NA,BMC,NA +cell host & microbe,1931-3128,1934-6069,cellhostmicrobe,0,0,1,1,Microbiology | Parasitology | Virology,NA,NA,CELL PRESS,2014-11-26 +cell journal,2228-5806,2228-5814,NA,0,0,1,0,Cell Biology,NA,NA,ROYAN INST,NA +cell metabolism,1550-4131,1932-7420,Cell_Metabolism,0,0,1,1,Cell Biology | Endocrinology & Metabolism,NA,NA,CELL PRESS,2015-05-08 +cell proliferation,0960-7722,1365-2184,NA,0,0,1,0,Cell Biology,NA,NA,WILEY,NA +cell reports,2211-1247,2211-1247,CellReports,0,0,1,1,Cell Biology,NA,NA,CELL PRESS,2011-07-20 +cell research,1001-0602,1748-7838,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGERNATURE,NA +cell stem cell,1934-5909,1875-9777,CellStemCell,0,0,1,1,Cell & Tissue Engineering | Cell Biology,NA,NA,CELL PRESS,2009-06-23 +cell stress & chaperones,1355-8145,1466-1268,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGER,NA +cell structure and function,0386-7196,1347-3700,NA,0,0,1,0,Cell Biology,NA,NA,JAPAN SOC CELL BIOLOGY,NA +cell systems,2405-4712,2405-4720,CellSystemsCP,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,CELL PRESS,2014-10-28 +cell transplantation,0963-6897,1555-3892,CellTransplantJ,0,0,1,1,"Cell & Tissue Engineering | Medicine, Research & Experimental | Transplantation",NA,NA,SAGE PUBLICATIONS INC,2013-03-27 +cells,2073-4409,2073-4409,NA,0,0,1,0,Cell Biology,NA,NA,MDPI,NA +cells & development,2667-2901,2667-2901,CellsDev,0,0,1,1,Developmental Biology,NA,NA,ELSEVIER,2020-11-17 +cells tissues organs,1422-6405,1422-6421,NA,0,0,1,0,Anatomy & Morphology | Cell Biology | Developmental Biology,NA,NA,KARGER,NA +cellular & molecular biology letters,1425-8153,1689-1392,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,BMC,NA +cellular & molecular immunology,1672-7681,2042-0226,NA,0,0,1,0,Immunology,NA,NA,CHIN SOCIETY IMMUNOLOGY,NA +cellular and molecular bioengineering,1865-5025,1865-5033,CMBEjournal,0,0,1,1,"Cell & Tissue Engineering | Biophysics | Cell Biology | Engineering, Biomedical",NA,NA,SPRINGER,2013-05-09 +cellular and molecular biology,0145-5680,1165-158X,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,C M B ASSOC,NA +cellular and molecular gastroenterology and hepatology,2352-345X,2352-345X,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,ELSEVIER INC,NA +cellular and molecular life sciences,1420-682X,1420-9071,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,SPRINGER BASEL AG,NA +cellular and molecular neurobiology,0272-4340,1573-6830,NA,0,0,1,0,Cell Biology | Neurosciences,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +cellular immunology,0008-8749,1090-2163,NA,0,0,1,0,Cell Biology | Immunology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +cellular microbiology,1462-5814,1462-5822,CellMicrobiol,0,0,1,1,Cell Biology | Microbiology,NA,NA,WILEY,2017-08-22 +cellular oncology,2211-3428,2211-3436,NA,0,0,1,0,Oncology | Cell Biology | Pathology,NA,NA,SPRINGER,NA +cellular polymers,0262-4893,1478-2421,NA,0,0,1,0,"Materials Science, Biomaterials | Polymer Science",NA,NA,SAGE PUBLICATIONS LTD,NA +cellular reprogramming,2152-4971,2152-4998,CellRepJrnl,0,0,1,1,Cell & Tissue Engineering | Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,"MARY ANN LIEBERT, INC",2021-10-06 +cellular signalling,0898-6568,1873-3913,NA,0,0,1,0,Cell Biology,NA,NA,ELSEVIER SCIENCE INC,NA +cellulose,0969-0239,1572-882X,NA,0,0,1,0,"Materials Science, Paper & Wood | Materials Science, Textiles | Polymer Science",NA,NA,SPRINGER,NA +cellulose chemistry and technology,0576-9787,0576-9787,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,EDITURA ACAD ROMANE,NA +cement & concrete composites,0958-9465,1873-393X,NA,0,0,1,0,"Construction & Building Technology | Materials Science, Composites",NA,NA,ELSEVIER SCI LTD,NA +cement and concrete research,0008-8846,1873-3948,NA,0,0,1,0,"Construction & Building Technology | Materials Science, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +cement wapno beton,1425-8129,NA,CWB_Editorial,0,0,1,1,"Construction & Building Technology | Materials Science, Composites",NA,NA,STOWARZYSZENIE PRODUCENTOW CEMENTU,2019-05-17 +centaurus,0008-8994,1600-0498,Centaurus_ESHS,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,TECH SCIENCE PRESS,2019-05-15 +centaurus,0008-8994,1600-0498,Centaurus_ESHS,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,WILEY,2019-05-15 +centaurus,0008-8994,1600-0498,Centaurus_ESHS,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,WILEY,2019-05-15 +central asian survey,0263-4937,1465-3354,CA_Survey,0,1,0,1,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-03-06 +central asiatic journal,0008-9192,NA,NA,1,0,0,0,NA,NA,Asian Studies,VERLAG OTTO HARRASSOWITZ,NA +central europe,1479-0963,1745-8218,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +central european history,0008-9389,1569-1616,NA,1,1,0,0,NA,History,History,CAMBRIDGE UNIV PRESS,NA +central european history,0008-9389,1569-1616,NA,1,1,0,0,NA,History,History,CAMBRIDGE UNIV PRESS,NA +central european journal of energetic materials,1733-7178,2353-1843,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical",NA,NA,INST INDUSTRIAL ORGANIC CHEMISTRY,NA +central european journal of immunology,1426-3912,1644-4124,NA,0,0,1,0,Immunology,NA,NA,TERMEDIA PUBLISHING HOUSE LTD,NA +central european journal of operations research,1435-246X,1613-9178,NA,0,0,1,0,Operations Research & Management Science,NA,NA,SPRINGER,NA +central european journal of public health,1210-7778,1803-1048,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"NATL INST PUBLIC HEALTH",NA +central european journal of public health,1210-7778,1803-1048,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"NATL INST PUBLIC HEALTH",NA +cepal review,0251-2920,1684-0348,NA,0,1,0,0,NA,Economics,NA,COMISION ECONOMICA PARA AMERICA LATINA Y EL CARIBE,NA +cephalalgia,0333-1024,1468-2982,JCephalalgia,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,SAGE PUBLICATIONS LTD,2014-02-17 +ceramics-art and perception,1035-1841,1035-1841,NA,1,0,0,0,NA,NA,Art,MANSFIELD CERAMICS PTY LTD,NA +ceramics-silikaty,0862-5468,1804-5847,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,"UNIV CHEMISTRY & TECHNOLOGY, PRAGUE",NA +ceramics international,0272-8842,1873-3956,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,ELSEVIER SCI LTD,NA +cereal chemistry,0009-0352,1943-3638,CerealChem,0,0,1,1,"Chemistry, Applied | Food Science & Technology",NA,NA,WILEY,2016-06-09 +cereal research communications,0133-3720,1788-9170,NA,0,0,1,0,Agronomy,NA,NA,SPRINGER HEIDELBERG,NA +cerebellum,1473-4222,1473-4230,TheCerebellum,0,0,1,1,Neurosciences,NA,NA,SPRINGER,2010-06-24 +cerebral cortex,1047-3211,1460-2199,NA,0,0,1,0,Neurosciences,NA,NA,OXFORD UNIV PRESS INC,NA +cerebrovascular diseases,1015-9770,1421-9786,NA,0,0,1,0,Clinical Neurology | Peripheral Vascular Diseases,NA,NA,KARGER,NA +cerne,0104-7760,2317-6342,NA,0,0,1,0,Forestry,NA,NA,UNIV FEDERAL LAVRAS-UFLA,NA +cesifo economic studies,1610-241X,1612-7501,NA,0,1,0,0,NA,Economics,NA,OXFORD UNIV PRESS,NA +ceska a slovenska neurologie a neurochirurgie,1210-7859,1802-4041,NA,0,0,1,0,Neurosciences | Surgery,NA,NA,CZECH MEDICAL SOC,NA +ceska literatura,0009-0468,2571-094X,NA,1,0,0,0,NA,NA,"Literature, Slavic","CZECH ACAD SCIENCES, INST CZECH LITERATURE",NA +ceskoslovenska psychologie,0009-062X,1804-6436,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,ACADEMIA,NA +chalcogenide letters,1584-8663,1584-8663,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,VIRTUAL CO PHYSICS SRL,NA +change over time-an international journal of conservation and the built environment,2153-053X,2153-0548,ChangeOverTime_,1,0,0,1,NA,NA,Architecture,UNIV PENNSYLVANIA PRESS,2017-03-09 +channels,1933-6950,1933-6969,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,TAYLOR & FRANCIS INC,NA +chaos,1054-1500,1089-7682,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,AIP PUBLISHING,NA +chaos solitons & fractals,0960-0779,1873-2887,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Physics, Multidisciplinary | Physics, Mathematical",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +chasqui-revista de literatura latinoamericana,0145-8973,2327-4247,NA,1,0,0,0,NA,NA,Literary Reviews,ARIZONA STATE UNIV,NA +chaucer review,0009-2002,1528-4204,NA,1,0,0,0,NA,NA,"Medieval & Renaissance Studies | Literature, British Isles",PENN STATE UNIV PRESS,NA +chelonian conservation and biology,1071-8443,1943-3956,CCB_Journal,0,0,1,1,Zoology,NA,NA,ALLEN PRESS INC,2019-03-01 +chem,2451-9294,2451-9294,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CELL PRESS,NA +chembiochem,1439-4227,1439-7633,ChemBioChem,0,0,1,1,"Biochemistry & Molecular Biology | Chemistry, Medicinal",NA,NA,WILEY-V C H VERLAG GMBH,2012-06-26 +chembioeng reviews,2196-9744,2196-9744,NA,0,0,1,0,"Engineering, Chemical",NA,NA,WILEY-V C H VERLAG GMBH,NA +chemcatchem,1867-3880,1867-3899,ChemCatChem,0,0,1,1,"Chemistry, Physical",NA,NA,WILEY-V C H VERLAG GMBH,2013-11-11 +chemelectrochem,2196-0216,2196-0216,ChemElectroChem,0,0,1,1,Electrochemistry,NA,NA,WILEY-V C H VERLAG GMBH,2013-04-19 +chemical & engineering news,0009-2347,1520-605X,cenmag,0,0,1,1,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,AMER CHEMICAL SOC,2010-01-19 +chemical & pharmaceutical bulletin,0009-2363,1347-5223,NA,0,0,1,0,"Chemistry, Medicinal | Chemistry, Multidisciplinary | Pharmacology & Pharmacy",NA,NA,PHARMACEUTICAL SOC JAPAN,NA +chemical and biochemical engineering quarterly,0352-9568,1846-5153,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Engineering, Chemical",NA,NA,CROATIAN SOC CHEMICAL ENGINEERING TECHNOLOGY,NA +chemical and biological technologies in agriculture,2196-5641,2196-5641,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,SPRINGER,NA +chemical and process engineering-inzynieria chemiczna i procesowa,0208-6425,2300-1925,NA,0,0,1,0,"Engineering, Chemical",NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES",NA +chemical biology & drug design,1747-0277,1747-0285,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Medicinal",NA,NA,WILEY,NA +chemical communications,1359-7345,1364-548X,ChemCommun,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,2009-03-11 +chemical engineering & technology,0930-7516,1521-4125,NA,0,0,1,0,"Engineering, Chemical",NA,NA,WILEY-V C H VERLAG GMBH,NA +chemical engineering and processing-process intensification,0255-2701,1873-3204,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical",NA,NA,ELSEVIER SCIENCE SA,NA +chemical engineering communications,0098-6445,1563-5201,NA,0,0,1,0,"Engineering, Chemical",NA,NA,TAYLOR & FRANCIS INC,NA +chemical engineering journal,1385-8947,1873-3212,Chem_Eng_J,0,0,1,1,"Engineering, Environmental | Engineering, Chemical",NA,NA,ELSEVIER SCIENCE SA,2019-10-24 +chemical engineering progress,0360-7275,1945-0710,NA,0,0,1,0,"Engineering, Chemical",NA,NA,AMER INST CHEMICAL ENGINEERS,NA +chemical engineering research & design,0263-8762,1744-3563,NA,0,0,1,0,"Engineering, Chemical",NA,NA,ELSEVIER,NA +chemical engineering science,0009-2509,1873-4405,NA,0,0,1,0,"Engineering, Chemical",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +chemical geology,0009-2541,1872-6836,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,ELSEVIER,NA +chemical industry & chemical engineering quarterly,1451-9372,2217-7434,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical",NA,NA,ASSOC CHEMICAL ENG,NA +chemical journal of chinese universities-chinese,0251-0790,0251-0790,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,HIGHER EDUCATION PRESS,NA +chemical papers,0366-6352,2585-7290,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER INT PUBL AG,NA +chemical physics,0301-0104,1873-4421,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,ELSEVIER,NA +chemical physics letters,0009-2614,1873-4448,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,ELSEVIER,NA +chemical record,1527-8999,1528-0691,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +chemical research in chinese universities,1005-9040,2210-3171,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,HIGHER EDUCATION PRESS,NA +chemical research in toxicology,0893-228X,1520-5010,NA,0,0,1,0,"Chemistry, Medicinal | Chemistry, Multidisciplinary | Toxicology",NA,NA,AMER CHEMICAL SOC,NA +chemical reviews,0009-2665,1520-6890,ACSChemRev,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2017-01-12 +chemical science,2041-6520,2041-6539,ChemicalScience,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,2009-08-13 +chemical senses,0379-864X,1464-3553,NA,0,0,1,0,Behavioral Sciences | Food Science & Technology | Neurosciences | Physiology,NA,NA,OXFORD UNIV PRESS,NA +chemical society reviews,0306-0012,1460-4744,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,NA +chemicke listy,0009-2770,1213-7103,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CHEMICKE LISTY,NA +chemico-biological interactions,0009-2797,1872-7786,NA,0,0,1,0,Biochemistry & Molecular Biology | Pharmacology & Pharmacy | Toxicology,NA,NA,ELSEVIER IRELAND LTD,NA +chemie in unserer zeit,0009-2851,1521-3781,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +chemie ingenieur technik,0009-286X,1522-2640,NA,0,0,1,0,"Engineering, Chemical",NA,NA,WILEY-V C H VERLAG GMBH,NA +chemija,0235-7216,0235-7216,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,LIETUVOS MOKSLU AKAD LEIDYKLA,NA +chemistry-a european journal,0947-6539,1521-3765,ChemEurJ,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,2013-06-16 +chemistry-an asian journal,1861-4728,1861-471X,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +chemistry & biodiversity,1612-1872,1612-1880,ChemBiodiv,0,0,1,1,"Biochemistry & Molecular Biology | Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,2018-08-31 +chemistry & industry,0009-3068,2047-6329,ChemandInd,0,0,1,1,"Chemistry, Applied",NA,NA,"WILEY PERIODICALS, INC",2011-12-28 +chemistry and ecology,0275-7540,1029-0370,NA,0,0,1,0,Ecology | Environmental Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +chemistry and physics of lipids,0009-3084,1873-2941,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER IRELAND LTD,NA +chemistry and technology of fuels and oils,0009-3092,1573-8310,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical | Engineering, Petroleum",NA,NA,SPRINGER,NA +chemistry education research and practice,1109-4028,1756-1108,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,ROYAL SOC CHEMISTRY,NA +chemistry education research and practice,1109-4028,1756-1108,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,ROYAL SOC CHEMISTRY,NA +chemistry letters,0366-7022,1348-0715,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CHEMICAL SOC JAPAN,NA +chemistry of heterocyclic compounds,0009-3122,1573-8353,NA,0,0,1,0,"Chemistry, Organic",NA,NA,SPRINGER,NA +chemistry of materials,0897-4756,1520-5002,ChemMater,0,0,1,1,"Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2013-12-02 +chemistry of natural compounds,0009-3130,1573-8388,NA,0,0,1,0,"Chemistry, Medicinal | Chemistry, Organic",NA,NA,SPRINGER,NA +chemistryopen,2191-1363,2191-1363,ChemistryOpen,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,2012-08-21 +chemistryselect,2365-6549,2365-6549,ChemistrySelect,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,2015-12-01 +chemmedchem,1860-7179,1860-7187,ChemMedChem,0,0,1,1,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,WILEY-V C H VERLAG GMBH,2013-09-03 +chemnanomat,2199-692X,2199-692X,ChemNanoMat,0,0,1,1,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,2014-10-27 +chemoecology,0937-7409,1423-0445,NA,0,0,1,0,Biochemistry & Molecular Biology | Ecology,NA,NA,SPRINGER BASEL AG,NA +chemometrics and intelligent laboratory systems,0169-7439,1873-3239,NA,0,0,1,0,"Automation & Control Systems | Chemistry, Analytical | Computer Science, Artificial Intelligence | Instruments & Instrumentation | Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,ELSEVIER,NA +chemosensors,2227-9040,2227-9040,chemosens_MDPI,0,0,1,1,"Chemistry, Analytical | Electrochemistry | Instruments & Instrumentation",NA,NA,MDPI,2016-10-27 +chemosensory perception,1936-5802,1936-5810,NA,0,0,1,0,Food Science & Technology | Neurosciences,NA,NA,SPRINGER,NA +chemosphere,0045-6535,1879-1298,NA,0,0,1,0,Environmental Sciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +chemotherapy,0009-3157,1421-9794,NA,0,0,1,0,Oncology | Pharmacology & Pharmacy,NA,NA,KARGER,NA +chemphotochem,2367-0932,2367-0932,ChemPhotoChem,0,0,1,1,"Chemistry, Physical",NA,NA,WILEY-V C H VERLAG GMBH,2016-08-02 +chemphyschem,1439-4235,1439-7641,ChemPhysChem,0,0,1,1,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,WILEY-V C H VERLAG GMBH,2012-08-17 +chempluschem,2192-6506,2192-6506,ChemPlusChem,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,2014-11-25 +chemsuschem,1864-5631,1864-564X,ChemSusChem,0,0,1,1,"Chemistry, Multidisciplinary | Green & Sustainable Science & Technology",NA,NA,WILEY-V C H VERLAG GMBH,2009-08-10 +chest,0012-3692,1931-3543,NA,0,0,1,0,Critical Care Medicine | Respiratory System,NA,NA,ELSEVIER,NA +chiang mai journal of science,0125-2526,0125-2526,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,"CHIANG MAI UNIV, FAC SCIENCE",NA +chicago review,0009-3696,2327-5804,chireview,1,0,0,1,NA,NA,Literary Reviews,CHICAGO REVIEW,2013-03-14 +child & family behavior therapy,0731-7107,1545-228X,NA,0,1,0,0,NA,"Psychology, Clinical | Family Studies",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +child & family social work,1356-7500,1365-2206,NA,0,1,0,0,NA,Family Studies | Social Work,NA,WILEY,NA +child & youth care forum,1053-1890,1573-3319,NA,0,1,0,0,NA,"Psychology, Development",NA,SPRINGER,NA +child abuse & neglect,0145-2134,1873-7757,NA,0,1,0,0,NA,"Family Studies | Psychology, Social | Social Work",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +child abuse review,0952-9136,1099-0852,Child_Abuse_Rev,0,1,0,1,NA,Family Studies | Social Work,NA,WILEY,2017-04-24 +child and adolescent mental health,1475-357X,1475-3588,NA,0,1,1,0,Pediatrics | Psychiatry,"Psychiatry | Psychology, Clinical",NA,WILEY,NA +child and adolescent mental health,1475-357X,1475-3588,NA,0,1,1,0,Pediatrics | Psychiatry,"Psychiatry | Psychology, Clinical",NA,WILEY,NA +child and adolescent psychiatric clinics of north america,1056-4993,1558-0490,NA,0,1,0,0,NA,Psychiatry,NA,W B SAUNDERS CO-ELSEVIER INC,NA +child and adolescent psychiatry and mental health,1753-2000,1753-2000,NA,0,1,1,0,Pediatrics | Psychiatry,Psychiatry,NA,BMC,NA +child and adolescent psychiatry and mental health,1753-2000,1753-2000,NA,0,1,1,0,Pediatrics | Psychiatry,Psychiatry,NA,BMC,NA +child and adolescent social work journal,0738-0151,1573-2797,NA,0,1,0,0,NA,Social Work,NA,SPRINGER,NA +child care health and development,0305-1862,1365-2214,NA,0,1,1,0,Pediatrics,"Psychology, Development",NA,WILEY,NA +child care health and development,0305-1862,1365-2214,NA,0,1,1,0,Pediatrics,"Psychology, Development",NA,WILEY,NA +child development,0009-3920,1467-8624,NA,0,1,0,0,NA,"Psychology, Educational | Psychology, Development",NA,WILEY,NA +child development perspectives,1750-8592,1750-8606,NA,0,1,0,0,NA,"Psychology, Development",NA,WILEY,NA +child indicators research,1874-897X,1874-8988,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SPRINGER,NA +child language teaching & therapy,0265-6590,1477-0865,CLTTJournal,1,1,0,1,NA,"Education, Special | Linguistics",Language & Linguistics,SAGE PUBLICATIONS LTD,2018-06-04 +child language teaching & therapy,0265-6590,1477-0865,CLTTJournal,1,1,0,1,NA,"Education, Special | Linguistics",Language & Linguistics,SAGE PUBLICATIONS LTD,2018-06-04 +child maltreatment,1077-5595,1552-6119,NA,0,1,0,0,NA,Family Studies | Social Work,NA,SAGE PUBLICATIONS INC,NA +child neuropsychology,0929-7049,1744-4136,ChildNeuropsyc1,0,0,1,1,Clinical Neurology,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-03-17 +child psychiatry & human development,0009-398X,1573-3327,NA,0,1,0,0,NA,"Psychology, Development | Psychiatry",NA,SPRINGER,NA +child welfare,0009-4021,NA,NA,0,1,0,0,NA,Family Studies | Social Work,NA,CHILD WELFARE LEAGUE AMER INC,NA +childhood-a global journal of child research,0907-5682,1461-7013,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,NA +childhood obesity,2153-2168,2153-2176,ChildObesity_jn,0,0,1,1,Pediatrics,NA,NA,"MARY ANN LIEBERT, INC",2009-07-01 +children-basel,2227-9067,2227-9067,NA,0,0,1,0,Pediatrics,NA,NA,MDPI,NA +children & society,0951-0605,1099-0860,CandS_Journal,0,1,0,1,NA,Social Work,NA,WILEY,2021-02-11 +children and youth services review,0190-7409,1873-7765,NA,0,1,0,0,NA,Family Studies | Social Work,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +childrens geographies,1473-3285,1473-3277,ChildrensGeogs,0,1,0,1,NA,Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-06-13 +childrens health care,0273-9615,1532-6888,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +childrens literature in education,0045-6713,1573-1693,NA,1,0,0,0,NA,NA,Literature,SPRINGER,NA +childs nervous system,0256-7040,1433-0350,NA,0,0,1,0,Clinical Neurology | Pediatrics | Surgery,NA,NA,SPRINGER,NA +chilean journal of agricultural research,0718-5839,0718-5839,NA,0,0,1,0,"Agriculture, Multidisciplinary | Agronomy",NA,NA,INST INVESTIGACIONES AGROPECUARIAS,NA +chimia,0009-4293,0009-4293,CHIMIA_journal,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,SWISS CHEMICAL SOC,2017-08-09 +china-an international journal,0219-7472,0219-8614,NA,0,1,0,0,NA,Area Studies,NA,NUS PRESS PTE LTD,NA +china & world economy,1671-2234,1749-124X,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +china agricultural economic review,1756-137X,1756-1388,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,EMERALD GROUP PUBLISHING LTD,NA +china agricultural economic review,1756-137X,1756-1388,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,EMERALD GROUP PUBLISHING LTD,NA +china communications,1673-5447,NA,NA,0,0,1,0,Telecommunications,NA,NA,CHINA INST COMMUNICATIONS,NA +china economic review,1043-951X,1873-7781,chinaeconreview,0,1,0,1,NA,Economics,NA,ELSEVIER SCIENCE INC,2008-07-09 +china foundry,1672-6421,2365-9459,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER SINGAPORE PTE LTD,NA +china information,0920-203X,1741-590X,CIN_tweets,0,1,0,1,NA,Area Studies,NA,SAGE PUBLICATIONS INC,2012-08-14 +china journal,1324-9347,1835-8535,NA,0,1,0,0,NA,Area Studies,NA,UNIV CHICAGO PRESS,NA +china ocean engineering,0890-5487,2191-8945,NA,0,0,1,0,"Engineering, Civil | Engineering, Ocean | Engineering, Mechanical | Water Resources",NA,NA,CHINA OCEAN PRESS,NA +china perspectives,2070-3449,1996-4617,NA,0,1,0,0,NA,Area Studies,NA,FRENCH CENTRE RESEARCH CONTEMPORARY CHINA,NA +china petroleum processing & petrochemical technology,1008-6234,NA,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical | Engineering, Petroleum",NA,NA,CHINA PETROLEUM PROCESSING & PETROCHEMICAL TECHNOLOGY PRESS,NA +china quarterly,0305-7410,1468-2648,chinaquarterly,0,1,0,1,NA,Area Studies,NA,CAMBRIDGE UNIV PRESS,2013-05-07 +china review-an interdisciplinary journal on greater china,1680-2012,1680-2012,NA,0,1,0,0,NA,Area Studies,NA,CHINESE UNIV PRESS,NA +chinese annals of mathematics series b,0252-9599,1860-6261,NA,0,0,1,0,Mathematics,NA,NA,SHANGHAI SCIENTIFIC TECHNOLOGY LITERATURE PUBLISHING HOUSE,NA +chinese chemical letters,1001-8417,1878-5964,ChinChemLett,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,ELSEVIER SCIENCE INC,2020-05-03 +chinese geographical science,1002-0063,1993-064X,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +chinese journal of aeronautics,1000-9361,2588-9230,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,ELSEVIER SCIENCE INC,NA +chinese journal of analytical chemistry,0253-3820,1872-2040,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,SCIENCE PRESS,NA +chinese journal of cancer research,1000-9604,1993-0631,NA,0,0,1,0,Oncology,NA,NA,CHINESE JOURNAL CANCER RESEARCH CO,NA +chinese journal of catalysis,0253-9837,1872-2067,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Engineering, Chemical",NA,NA,SCIENCE PRESS,NA +chinese journal of chemical engineering,1004-9541,2210-321X,NA,0,0,1,0,"Engineering, Chemical",NA,NA,CHEMICAL INDUSTRY PRESS CO LTD,NA +chinese journal of chemical physics,1674-0068,2327-2244,NA,0,0,1,0,"Physics, Atomic, Molecular & Chemical",NA,NA,CHINESE PHYSICAL SOC,NA +chinese journal of chemistry,1001-604X,1614-7065,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +chinese journal of communication,1754-4750,1754-4769,NA,0,1,0,0,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +chinese journal of electronics,1022-4653,2075-5597,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +chinese journal of geophysics-chinese edition,0001-5733,0001-5733,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SCIENCE PRESS,NA +chinese journal of inorganic chemistry,1001-4861,1001-4861,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,CHINESE CHEMICAL SOC,NA +chinese journal of integrative medicine,1672-0415,1993-0402,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,SPRINGER,NA +chinese journal of international law,1540-1650,1746-9937,NA,0,1,0,0,NA,International Relations | Law,NA,OXFORD UNIV PRESS,NA +chinese journal of international politics,1750-8916,1750-8924,NA,0,1,0,0,NA,International Relations,NA,OXFORD UNIV PRESS,NA +chinese journal of mechanical engineering,1000-9345,2192-8258,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,SPRINGER,NA +chinese journal of natural medicines,2095-6975,1875-5364,NA,0,0,1,0,Integrative & Complementary Medicine | Pharmacology & Pharmacy,NA,NA,CHINESE JOURNAL NATURAL MEDICINES,NA +chinese journal of organic chemistry,0253-2786,0253-2786,NA,0,0,1,0,"Chemistry, Organic",NA,NA,SCIENCE PRESS,NA +chinese journal of physics,0577-9073,0577-9073,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,ELSEVIER,NA +chinese journal of physiology,0304-4920,2666-0059,NA,0,0,1,0,Physiology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +chinese journal of polymer science,0256-7679,1439-6203,NA,0,0,1,0,Polymer Science,NA,NA,SPRINGER,NA +chinese journal of structural chemistry,0254-5861,0254-5861,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Crystallography",NA,NA,CHINESE JOURNAL STRUCTURAL CHEMISTRY,NA +chinese literature and thought today,NA,2768-3532,NA,1,0,0,0,NA,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +chinese management studies,1750-614X,1750-6158,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +chinese medical journal,0366-6999,2542-5641,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +chinese medicine,1749-8546,1749-8546,NA,0,0,1,0,Integrative & Complementary Medicine | Pharmacology & Pharmacy,NA,NA,BMC,NA +chinese optics letters,1671-7694,1671-7694,NA,0,0,1,0,Optics,NA,NA,OSA-OPTICAL SOC,NA +chinese physics b,1674-1056,2058-3834,ChinesePhysicsB,0,0,1,1,"Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,2019-04-03 +chinese physics c,1674-1137,2058-6132,NA,0,0,1,0,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,IOP PUBLISHING LTD,NA +chinese physics letters,0256-307X,1741-3540,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +chinese sociological review,2162-0555,2162-0563,csr_sociology,0,1,0,1,NA,Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-07-15 +chinese studies in history,0009-4633,1558-0407,NA,1,0,0,0,NA,NA,History | Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +chirality,0899-0042,1520-636X,NA,0,0,1,0,"Chemistry, Medicinal | Chemistry, Analytical | Chemistry, Organic | Pharmacology & Pharmacy",NA,NA,WILEY,NA +chiropractic & manual therapies,2045-709X,2045-709X,NA,0,0,1,0,Rehabilitation,NA,NA,BMC,NA +chirurg,0009-4722,1433-0385,NA,0,0,1,0,Surgery,NA,NA,SPRINGER HEIDELBERG,NA +christian bioethics,1380-3603,1744-4195,NA,1,0,0,0,NA,NA,Philosophy | Religion,OXFORD UNIV PRESS,NA +chromatographia,0009-5893,1612-1112,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,SPRINGER HEIDELBERG,NA +chromosoma,0009-5915,1432-0886,NA,0,0,1,0,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,SPRINGER,NA +chromosome research,0967-3849,1573-6849,NA,0,0,1,0,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,SPRINGER,NA +chronic illness,1742-3953,1745-9206,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Medicine, General & Internal","Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS LTD,NA +chronic illness,1742-3953,1745-9206,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Medicine, General & Internal","Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS LTD,NA +chronic obstructive pulmonary diseases-journal of the copd foundation,2372-952X,2372-952X,NA,0,0,1,0,Respiratory System,NA,NA,COPD FOUNDATION,NA +chronic respiratory disease,1479-9723,1479-9731,CRD_Journal,0,0,1,1,Respiratory System,NA,NA,SAGE PUBLICATIONS LTD,2019-07-04 +chronobiology international,0742-0528,1525-6073,NA,0,0,1,0,Biology | Physiology,NA,NA,TAYLOR & FRANCIS INC,NA +chungara-revista de antropologia chilena,0717-7356,0717-7356,ChungaraRAC,0,1,0,1,NA,Anthropology,NA,UNIV TARAPACA,2015-06-22 +church history,0009-6407,1755-2613,NA,1,0,0,0,NA,NA,Religion | History,CAMBRIDGE UNIV PRESS,NA +ciencia & saude coletiva,1413-8123,1678-4561,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,ABRASCO-ASSOC BRASILEIRA POS-GRADUACAO & SAUDE COLETIVA,NA +ciencia e agrotecnologia,1413-7054,1981-1829,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,UNIV FEDERAL LAVRAS-UFLA,NA +ciencia e tecnica vitivinicola,2416-3953,2416-3953,NA,0,0,1,0,Food Science & Technology,NA,NA,ESTACAO VITIVINICOLA NACIONAL,NA +ciencia florestal,0103-9954,1980-5098,NA,0,0,1,0,Forestry,NA,NA,"CENTRO PESQUISAS FLORESTAIS, UFSM",NA +ciencia rural,0103-8478,1678-4596,CienciaRural,0,0,1,1,Agronomy,NA,NA,UNIV FEDERAL SANTA MARIA,2014-02-07 +ciencias marinas,0185-3880,2395-9053,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,"INST INVESTIGACIONES OCEANOLOGICAS, U A B C",NA +cin-computers informatics nursing,1538-2931,1538-9774,CIN_online,0,1,1,1,"Computer Science, Interdisciplinary Applications | Medical Informatics | Nursing",Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-12-07 +cin-computers informatics nursing,1538-2931,1538-9774,CIN_online,0,1,1,1,"Computer Science, Interdisciplinary Applications | Medical Informatics | Nursing",Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-12-07 +cineaste,0009-7004,0009-7004,Cineaste_Mag,1,0,0,1,NA,NA,"Film, Radio, Television",CINEASTE,2013-10-24 +cineforum,0009-7039,0009-7039,Cineforum_mag,1,0,0,1,NA,NA,"Film, Radio, Television",FEDERAZIONE ITALIANA CINEFORUM,2010-12-27 +cinemas d amerique latine,1267-4397,NA,NA,1,0,0,0,NA,NA,"Film, Radio, Television",PRESSES UNIV MIDI-PUM,NA +circuit world,0305-6120,1758-602X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +circuits systems and signal processing,0278-081X,1531-5878,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,SPRINGER BIRKHAUSER,NA +circulation,0009-7322,1524-4539,CircAHA,0,0,1,1,Cardiac & Cardiovascular System | Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2012-02-23 +circulation-arrhythmia and electrophysiology,1941-3149,1941-3084,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +circulation-cardiovascular imaging,1941-9651,1942-0080,NA,0,0,1,0,"Cardiac & Cardiovascular System | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +circulation-cardiovascular interventions,1941-7640,1941-7632,CircIntv,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2018-05-22 +circulation-cardiovascular quality and outcomes,1941-7705,1941-7713,CircOutcomes,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2013-09-17 +circulation-genomic and precision medicine,2574-8300,2574-8300,Circ_Gen,0,0,1,1,Cardiac & Cardiovascular System | Genetics & Heredity,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2017-11-27 +circulation-heart failure,1941-3289,1941-3297,CircHF,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2017-02-17 +circulation journal,1346-9843,1347-4820,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,JAPANESE CIRCULATION SOC,NA +circulation research,0009-7330,1524-4571,CircRes,0,0,1,1,Cardiac & Cardiovascular System | Hematology | Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2009-10-12 +circulo de linguistica aplicada a la comunicacion,1576-4737,1576-4737,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"UNIV COMPLUTENSE MADRID, SERVICIO PUBLICACIONES",NA +circulo de linguistica aplicada a la comunicacion,1576-4737,1576-4737,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"UNIV COMPLUTENSE MADRID, SERVICIO PUBLICACIONES",NA +cirp annals-manufacturing technology,0007-8506,1726-0604,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing",NA,NA,ELSEVIER,NA +cirp journal of manufacturing science and technology,1755-5817,1755-5817,NA,0,0,1,0,"Engineering, Manufacturing",NA,NA,ELSEVIER,NA +cirugia espanola,0009-739X,1578-147X,NA,0,0,1,0,Surgery,NA,NA,ELSEVIER ESPANA SLU,NA +cirugia y cirujanos,0009-7411,0009-7411,NA,0,0,1,0,Surgery,NA,NA,MEXICAN ACAD SURGERY,NA +cithara-essays in the judeo-christian tradition,0009-7527,0009-7527,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",ST BONAVENTURE UNIV,NA +cities,0264-2751,1873-6084,NA,0,1,0,0,NA,Urban Studies,NA,ELSEVIER SCI LTD,NA +citizenship studies,1362-1025,1469-3593,NA,0,1,0,0,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +city & community,1535-6841,1540-6040,CiCoJournal,0,1,0,1,NA,Sociology | Urban Studies,NA,WILEY,2018-08-08 +civil engineering,0885-7024,0885-7024,NA,0,0,1,0,"Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +civil engineering and environmental systems,1028-6608,1029-0249,NA,0,0,1,0,"Engineering, Civil",NA,NA,TAYLOR & FRANCIS LTD,NA +civil szemle,1786-3341,1786-3341,NA,0,1,0,0,NA,Public Administration,NA,UJ MANDATUM KONYVKIADO,NA +civil war history,0009-8078,1533-6271,NA,1,0,0,0,NA,NA,History,KENT STATE UNIV PRESS,NA +cla journal-college language association,0007-8549,2766-0265,NA,1,0,0,0,NA,NA,Literature,COLL LANGUAGE ASSOC,NA +cladistics,0748-3007,1096-0031,CladisticsAlert,0,0,1,1,Evolutionary Biology | Zoology,NA,NA,WILEY,2020-07-21 +classical and quantum gravity,0264-9381,1361-6382,CQGravity,0,0,1,1,"Astronomy & Astrophysics | Quantum Science & Technology | Physics, Multidisciplinary | Physics, Particles & Fields",NA,NA,IOP PUBLISHING LTD,2016-12-20 +classical antiquity,0278-6656,0278-6656,NA,1,0,0,0,NA,NA,Classics,UNIV CALIFORNIA PRESS,NA +classical journal,0009-8353,2327-5812,NA,1,0,0,0,NA,NA,Classics,"CLASSICAL ASSOC MIDDLE WEST SOUTH, INC",NA +classical philology,0009-837X,1546-072X,NA,1,0,0,0,NA,NA,Classics,UNIV CHICAGO PRESS,NA +classical quarterly,0009-8388,1471-6844,NA,1,0,0,0,NA,NA,Classics,CAMBRIDGE UNIV PRESS,NA +classical receptions journal,1759-5134,1759-5142,NA,1,0,0,0,NA,NA,"Classics | Humanities, Multidisciplinary",OXFORD UNIV PRESS,NA +classical review,0009-840X,1464-3561,Classics_Review,1,0,0,1,NA,NA,Classics,CAMBRIDGE UNIV PRESS,2021-03-29 +classical world,0009-8418,1558-9234,NA,1,0,0,0,NA,NA,Classics,CLASSICAL ASSOC ATLANTIC STATES,NA +clay minerals,0009-8558,1471-8030,NA,0,0,1,0,"Chemistry, Physical | Geosciences, Multidisciplinary | Mineralogy",NA,NA,MINERALOGICAL SOC,NA +clays and clay minerals,0009-8604,1552-8367,NA,0,0,1,0,"Chemistry, Physical | Geosciences, Multidisciplinary | Mineralogy | Soil Science",NA,NA,SPRINGER,NA +clcweb-comparative literature and culture,1481-4374,1481-4374,web_clc,1,0,0,1,NA,NA,Literature,PURDUE UNIV PRESS,2020-10-16 +clean-soil air water,1863-0650,1863-0669,NA,0,0,1,0,Green & Sustainable Science & Technology | Environmental Sciences | Marine & Freshwater Biology | Water Resources,NA,NA,WILEY,NA +clean technologies and environmental policy,1618-954X,1618-9558,NA,0,0,1,0,"Green & Sustainable Science & Technology | Engineering, Environmental | Environmental Sciences",NA,NA,SPRINGER,NA +cleft palate-craniofacial journal,1055-6656,1545-1569,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Surgery",NA,NA,SAGE PUBLICATIONS INC,NA +cleveland clinic journal of medicine,0891-1150,1939-2869,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,CLEVELAND CLINIC,NA +climacteric,1369-7137,1473-0804,ClimactericIMS,0,0,1,1,Obstetrics & Gynecology,NA,NA,TAYLOR & FRANCIS LTD,2014-03-05 +climate and development,1756-5529,1756-5537,ClimDevJournal,0,1,0,1,NA,Development Studies | Environmental Studies,NA,TAYLOR & FRANCIS LTD,2012-02-14 +climate change economics,2010-0078,2010-0086,NA,0,1,0,0,NA,Economics | Environmental Studies,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +climate dynamics,0930-7575,1432-0894,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,SPRINGER,NA +climate of the past,1814-9324,1814-9332,EGU_CP,0,0,1,1,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-10 +climate policy,1469-3062,1752-7457,Climate_Policy,0,1,0,1,NA,Environmental Studies | Public Administration,NA,TAYLOR & FRANCIS LTD,2014-07-31 +climate research,0936-577X,1616-1572,NA,0,0,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,INTER-RESEARCH,NA +climate risk management,2212-0963,2212-0963,RiskClimate,0,1,1,1,Environmental Sciences | Meteorology & Atmospheric Sciences,Environmental Studies,NA,ELSEVIER,2018-08-15 +climate risk management,2212-0963,2212-0963,RiskClimate,0,1,1,1,Environmental Sciences | Meteorology & Atmospheric Sciences,Environmental Studies,NA,ELSEVIER,2018-08-15 +climate services,2405-8807,2405-8807,NA,0,1,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences,Environmental Studies,NA,ELSEVIER,NA +climate services,2405-8807,2405-8807,NA,0,1,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences,Environmental Studies,NA,ELSEVIER,NA +climatic change,0165-0009,1573-1480,ClimaticChange_,0,0,1,1,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,SPRINGER,2021-07-19 +clinica chimica acta,0009-8981,1873-3492,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,ELSEVIER,NA +clinica y salud,1130-5274,2174-0550,RClinicaySalud,0,1,0,1,NA,"Psychology, Clinical",NA,COLEGIO OFICIAL PSICOLOGOS MADRID,2018-07-24 +clinical & experimental metastasis,0262-0898,1573-7276,NA,0,0,1,0,Oncology,NA,NA,SPRINGER,NA +clinical & translational immunology,2050-0068,2050-0068,ClinTransImmuno,0,0,1,1,Immunology,NA,NA,WILEY,2020-03-05 +clinical & translational oncology,1699-048X,1699-3055,NA,0,0,1,0,Oncology,NA,NA,SPRINGER INT PUBL AG,NA +clinical anatomy,0897-3806,1098-2353,NA,0,0,1,0,Anatomy & Morphology,NA,NA,WILEY,NA +clinical and applied thrombosis-hemostasis,1076-0296,1938-2723,NA,0,0,1,0,Hematology | Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS INC,NA +clinical and experimental allergy,0954-7894,1365-2222,NA,0,0,1,0,Allergy | Immunology,NA,NA,WILEY,NA +clinical and experimental dermatology,0307-6938,1365-2230,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +clinical and experimental hypertension,1064-1963,1525-6006,NA,0,0,1,0,Pharmacology & Pharmacy | Peripheral Vascular Diseases,NA,NA,TAYLOR & FRANCIS INC,NA +clinical and experimental immunology,0009-9104,1365-2249,NA,0,0,1,0,Immunology,NA,NA,WILEY,NA +clinical and experimental medicine,1591-8890,1591-9528,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +clinical and experimental nephrology,1342-1751,1437-7799,NA,0,0,1,0,Urology & Nephrology,NA,NA,SPRINGER,NA +clinical and experimental obstetrics & gynecology,0390-6663,0390-6663,CEOGjournal,0,0,1,1,Obstetrics & Gynecology,NA,NA,IMR PRESS,2020-04-03 +clinical and experimental ophthalmology,1442-6404,1442-9071,ClinExpOphthal,0,0,1,1,Ophthalmology,NA,NA,WILEY,2020-02-04 +clinical and experimental optometry,0816-4622,1444-0938,NA,0,0,1,0,Ophthalmology,NA,NA,TAYLOR & FRANCIS LTD,NA +clinical and experimental otorhinolaryngology,1976-8710,2005-0720,NA,0,0,1,0,Otorhinolaryngology,NA,NA,KOREAN SOC OTORHINOLARYNGOL,NA +clinical and experimental pharmacology and physiology,0305-1870,1440-1681,NA,0,0,1,0,Pharmacology & Pharmacy | Physiology,NA,NA,WILEY,NA +clinical and experimental rheumatology,0392-856X,1593-098X,clinexprheum,0,0,1,1,Rheumatology,NA,NA,CLINICAL & EXPER RHEUMATOLOGY,2015-11-05 +clinical and investigative medicine,0147-958X,1488-2353,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,CANADIAN SOC CLINICAL INVESTIGATION,NA +clinical and molecular hepatology,2287-2728,2287-285X,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,KOREAN ASSOC STUDY LIVER,NA +clinical and translational allergy,2045-7022,2045-7022,NA,0,0,1,0,Allergy,NA,NA,WILEY,NA +clinical and translational gastroenterology,2155-384X,2155-384X,ACG_CTG,0,0,1,1,Gastroenterology & Hepatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2021-05-20 +clinical and translational imaging,2281-5872,2281-7565,ClinTransImag,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER-VERLAG ITALIA SRL,2020-12-11 +clinical and translational medicine,2001-1326,2001-1326,NA,0,0,1,0,"Oncology | Medicine, Research & Experimental",NA,NA,JOHN WILEY & SONS LTD,NA +clinical autonomic research,0959-9851,1619-1560,ClinAutonRes,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,SPRINGER HEIDELBERG,2016-11-28 +clinical biochemistry,0009-9120,1873-2933,Clin_Biochem,0,0,1,1,Medical Laboratory Technology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2014-09-10 +clinical biomechanics,0268-0033,1879-1271,NA,0,0,1,0,"Engineering, Biomedical | Orthopedics | Sport Sciences",NA,NA,ELSEVIER SCI LTD,NA +clinical breast cancer,1526-8209,1938-0666,NA,0,0,1,0,Oncology,NA,NA,"CIG MEDIA GROUP, LP",NA +clinical cancer research,1078-0432,1557-3265,CCR_AACR,0,0,1,1,Oncology,NA,NA,AMER ASSOC CANCER RESEARCH,2018-07-24 +clinical cardiology,0160-9289,1932-8737,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,WILEY,NA +clinical case studies,1534-6501,1552-3802,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,SAGE PUBLICATIONS INC,NA +clinical chemistry,0009-9147,1530-8561,Clin_Chem_AACC,0,0,1,1,Medical Laboratory Technology,NA,NA,OXFORD UNIV PRESS INC,2009-11-12 +clinical chemistry and laboratory medicine,1434-6621,1437-4331,cclm_degruyter,0,0,1,1,Medical Laboratory Technology,NA,NA,WALTER DE GRUYTER GMBH,2016-07-31 +clinical child and family psychology review,1096-4037,1573-2827,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER/PLENUM PUBLISHERS,NA +clinical child psychology and psychiatry,1359-1045,1461-7021,CCPPJournal,0,1,1,1,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical | Psychology, Development",NA,SAGE PUBLICATIONS INC,2018-01-26 +clinical child psychology and psychiatry,1359-1045,1461-7021,CCPPJournal,0,1,1,1,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical | Psychology, Development",NA,SAGE PUBLICATIONS INC,2018-01-26 +clinical colorectal cancer,1533-0028,1938-0674,NA,0,0,1,0,Oncology,NA,NA,"CIG MEDIA GROUP, LP",NA +clinical cosmetic and investigational dermatology,1178-7015,1178-7015,NA,0,0,1,0,Dermatology,NA,NA,DOVE MEDICAL PRESS LTD,NA +clinical drug investigation,1173-2563,1179-1918,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ADIS INT LTD,NA +clinical dysmorphology,0962-8827,1473-5717,NA,0,0,1,0,Genetics & Heredity,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +clinical eeg and neuroscience,1550-0594,2169-5202,NA,0,0,1,0,Clinical Neurology | Neurosciences | Neuroimaging | Psychiatry | Psychology,NA,NA,SAGE PUBLICATIONS INC,NA +clinical endocrinology,0300-0664,1365-2265,ClinEndocr,0,0,1,1,Endocrinology & Metabolism,NA,NA,WILEY,2019-11-07 +clinical epidemiology,1179-1349,1179-1349,ClinEpidem,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,DOVE MEDICAL PRESS LTD,2009-07-03 +clinical epigenetics,1868-7075,1868-7083,NA,0,0,1,0,Oncology | Genetics & Heredity,NA,NA,BMC,NA +clinical gastroenterology and hepatology,1542-3565,1542-7714,AGA_CGH,0,0,1,1,Gastroenterology & Hepatology,NA,NA,ELSEVIER SCIENCE INC,2017-03-29 +clinical genetics,0009-9163,1399-0004,NA,0,0,1,0,Genetics & Heredity,NA,NA,WILEY,NA +clinical genitourinary cancer,1558-7673,1938-0682,NA,0,0,1,0,Oncology | Urology & Nephrology,NA,NA,"CIG MEDIA GROUP, LP",NA +clinical gerontologist,0731-7115,1545-2301,NA,0,1,1,0,Geriatrics & Gerontology | Psychiatry,Psychiatry | Gerontology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +clinical gerontologist,0731-7115,1545-2301,NA,0,1,1,0,Geriatrics & Gerontology | Psychiatry,Psychiatry | Gerontology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +clinical hemorheology and microcirculation,1386-0291,1875-8622,NA,0,0,1,0,Hematology | Peripheral Vascular Diseases,NA,NA,IOS PRESS,NA +clinical imaging,0899-7071,1873-4499,CI_Journal,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,2019-01-30 +clinical immunology,1521-6616,1521-7035,NA,0,0,1,0,Immunology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +clinical implant dentistry and related research,1523-0899,1708-8208,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +clinical infectious diseases,1058-4838,1537-6591,NA,0,0,1,0,Immunology | Infectious Diseases | Microbiology,NA,NA,OXFORD UNIV PRESS INC,NA +clinical interventions in aging,1178-1998,1178-1998,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,DOVE MEDICAL PRESS LTD,NA +clinical journal of oncology nursing,1092-1095,1538-067X,NA,0,1,1,0,Oncology | Nursing,Nursing,NA,ONCOLOGY NURSING SOC,NA +clinical journal of oncology nursing,1092-1095,1538-067X,NA,0,1,1,0,Oncology | Nursing,Nursing,NA,ONCOLOGY NURSING SOC,NA +clinical journal of pain,0749-8047,1536-5409,NA,0,0,1,0,Anesthesiology | Clinical Neurology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +clinical journal of sport medicine,1050-642X,1536-3724,CJSMonline,0,0,1,1,Orthopedics | Physiology | Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-05-13 +clinical journal of the american society of nephrology,1555-9041,1555-905X,NA,0,0,1,0,Urology & Nephrology,NA,NA,AMER SOC NEPHROLOGY,NA +clinical kidney journal,2048-8505,2048-8513,CKJsocial,0,0,1,1,Urology & Nephrology,NA,NA,OXFORD UNIV PRESS,2015-10-16 +clinical laboratory,1433-6510,NA,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,CLIN LAB PUBL,NA +clinical linguistics & phonetics,0269-9206,1464-5076,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,TAYLOR & FRANCIS INC,NA +clinical linguistics & phonetics,0269-9206,1464-5076,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,TAYLOR & FRANCIS INC,NA +clinical lung cancer,1525-7304,1938-0690,NA,0,0,1,0,Oncology,NA,NA,"CIG MEDIA GROUP, LP",NA +clinical lymphoma myeloma & leukemia,2152-2650,2152-2669,NA,0,0,1,0,Oncology | Hematology,NA,NA,"CIG MEDIA GROUP, LP",NA +clinical medicine,1470-2118,1473-4893,Clin_Med,0,0,1,1,"Medicine, General & Internal",NA,NA,ROY COLL PHYS LONDON EDITORIAL OFFICE,2017-04-21 +clinical medicine insights-oncology,1179-5549,1179-5549,NA,0,0,1,0,Oncology,NA,NA,SAGE PUBLICATIONS LTD,NA +clinical microbiology and infection,1198-743X,1469-0691,CMIJournal,0,0,1,1,Infectious Diseases | Microbiology,NA,NA,ELSEVIER SCI LTD,2019-06-30 +clinical microbiology reviews,0893-8512,1098-6618,NA,0,0,1,0,Microbiology,NA,NA,AMER SOC MICROBIOLOGY,NA +clinical nephrology,0301-0430,0301-0430,NA,0,0,1,0,Urology & Nephrology,NA,NA,DUSTRI-VERLAG DR KARL FEISTLE,NA +clinical neurology and neurosurgery,0303-8467,1872-6968,c_neurosurgery,0,0,1,1,Clinical Neurology | Surgery,NA,NA,ELSEVIER,2021-08-28 +clinical neuropathology,0722-5091,0722-5091,NA,0,0,1,0,Clinical Neurology | Pathology,NA,NA,DUSTRI-VERLAG DR KARL FEISTLE,NA +clinical neuropharmacology,0362-5664,1537-162X,NA,0,0,1,0,Clinical Neurology | Pharmacology & Pharmacy,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +clinical neurophysiology,1388-2457,1872-8952,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,ELSEVIER IRELAND LTD,NA +clinical neuropsychologist,1385-4046,1744-4144,NA,0,1,1,0,Clinical Neurology | Psychology,"Psychology, Clinical",NA,TAYLOR & FRANCIS INC,NA +clinical neuropsychologist,1385-4046,1744-4144,NA,0,1,1,0,Clinical Neurology | Psychology,"Psychology, Clinical",NA,TAYLOR & FRANCIS INC,NA +clinical neuroradiology,1869-1439,1869-1447,NA,0,0,1,0,"Clinical Neurology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER HEIDELBERG,NA +clinical nuclear medicine,0363-9762,1536-0229,ClinNuclearMed,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-17 +clinical nurse specialist,0887-6274,1538-9782,CNS_jrnl_online,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-03 +clinical nurse specialist,0887-6274,1538-9782,CNS_jrnl_online,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-03 +clinical nursing research,1054-7738,1552-3799,NA,0,1,1,0,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +clinical nursing research,1054-7738,1552-3799,NA,0,1,1,0,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +clinical nutrition,0261-5614,1532-1983,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,CHURCHILL LIVINGSTONE,NA +clinical obstetrics and gynecology,0009-9201,1532-5520,ClinObGyn,0,0,1,1,Obstetrics & Gynecology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-17 +clinical oncology,0936-6555,1433-2981,ClinOncology,0,0,1,1,Oncology,NA,NA,ELSEVIER SCIENCE LONDON,2021-06-25 +clinical oral implants research,0905-7161,1600-0501,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Engineering, Biomedical",NA,NA,WILEY,NA +clinical oral investigations,1432-6981,1436-3771,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,SPRINGER HEIDELBERG,NA +clinical orthopaedics and related research,0009-921X,1528-1132,Clinorthop,0,0,1,1,Orthopedics | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-05-18 +clinical otolaryngology,1749-4478,1749-4486,NA,0,0,1,0,Otorhinolaryngology,NA,NA,WILEY,NA +clinical pediatrics,0009-9228,1938-2707,NA,0,0,1,0,Pediatrics,NA,NA,SAGE PUBLICATIONS INC,NA +clinical pharmacokinetics,0312-5963,1179-1926,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ADIS INT LTD,NA +clinical pharmacology & therapeutics,0009-9236,1532-6535,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,WILEY,NA +clinical pharmacology in drug development,2160-7648,2160-7648,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,WILEY,NA +clinical physiology and functional imaging,1475-0961,1475-097X,NA,0,0,1,0,Physiology,NA,NA,WILEY,NA +clinical proteomics,1542-6416,1559-0275,NA,0,0,1,0,Biochemical Research Methods,NA,NA,BMC,NA +clinical psychological science,2167-7026,2167-7034,NA,0,1,1,0,Psychiatry | Psychology,"Psychology, Clinical",NA,SAGE PUBLICATIONS INC,NA +clinical psychological science,2167-7026,2167-7034,NA,0,1,1,0,Psychiatry | Psychology,"Psychology, Clinical",NA,SAGE PUBLICATIONS INC,NA +clinical psychologist,1328-4207,1742-9552,NA,0,1,1,0,Psychology,"Psychology, Clinical",NA,TAYLOR & FRANCIS LTD,NA +clinical psychologist,1328-4207,1742-9552,NA,0,1,1,0,Psychology,"Psychology, Clinical",NA,TAYLOR & FRANCIS LTD,NA +clinical psychology-science and practice,0969-5893,1468-2850,NA,0,1,0,0,NA,"Psychology, Clinical",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +clinical psychology & psychotherapy,1063-3995,1099-0879,NA,0,1,0,0,NA,"Psychology, Clinical",NA,WILEY,NA +clinical psychology review,0272-7358,1873-7811,NA,0,1,0,0,NA,"Psychology, Clinical",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +clinical psychopharmacology and neuroscience,1738-1088,2093-4327,NA,0,0,1,0,Neurosciences | Pharmacology & Pharmacy,NA,NA,KOREAN COLL NEUROPSYCHOPHARMACOLOGY,NA +clinical radiology,0009-9260,1365-229X,ClinRadiology,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,W B SAUNDERS CO LTD,2021-06-25 +clinical rehabilitation,0269-2155,1477-0873,ClinicalRehab,0,0,1,1,Rehabilitation,NA,NA,SAGE PUBLICATIONS LTD,2018-03-06 +clinical research in cardiology,1861-0684,1861-0692,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,SPRINGER HEIDELBERG,NA +clinical respiratory journal,1752-6981,1752-699X,NA,0,0,1,0,Respiratory System,NA,NA,WILEY,NA +clinical reviews in allergy & immunology,1080-0549,1559-0267,NA,0,0,1,0,Allergy | Immunology,NA,NA,HUMANA PRESS INC,NA +clinical rheumatology,0770-3198,1434-9949,NA,0,0,1,0,Rheumatology,NA,NA,SPRINGER LONDON LTD,NA +clinical science,0143-5221,1470-8736,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,PORTLAND PRESS LTD,NA +clinical simulation in nursing,1876-1399,1876-1402,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +clinical simulation in nursing,1876-1399,1876-1402,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +clinical social work journal,0091-1674,1573-3343,CSWJournal,0,1,0,1,NA,Social Work,NA,SPRINGER,2012-06-19 +clinical spine surgery,2380-0186,2380-0186,ClinSpineSurg,0,0,1,1,Clinical Neurology | Orthopedics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-17 +clinical therapeutics,0149-2918,1879-114X,clinthe,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ELSEVIER,2011-09-12 +clinical therapeutics,0149-2918,1879-114X,clinthe,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ELSEVIER,2011-09-12 +clinical toxicology,1556-3650,1556-9519,Clin_Tox,0,0,1,1,Toxicology,NA,NA,TAYLOR & FRANCIS LTD,2015-10-10 +clinical transplantation,0902-0063,1399-0012,CliniTransplant,0,0,1,1,Surgery | Transplantation,NA,NA,WILEY,2020-01-23 +clinical trials,1740-7745,1740-7753,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,SAGE PUBLICATIONS LTD,NA +clinics,1807-5932,1980-5322,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,"HOSPITAL CLINICAS, UNIV SAO PAULO",NA +clinics and research in hepatology and gastroenterology,2210-7401,2210-741X,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",NA +clinics in chest medicine,0272-5231,1557-8216,NA,0,0,1,0,Respiratory System,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +clinics in colon and rectal surgery,1531-0043,1530-9681,ClinicsColorect,0,0,1,1,Gastroenterology & Hepatology | Surgery,NA,NA,THIEME MEDICAL PUBL INC,2017-06-05 +clinics in dermatology,0738-081X,1879-1131,NA,0,0,1,0,Dermatology,NA,NA,ELSEVIER SCIENCE INC,NA +clinics in geriatric medicine,0749-0690,1879-8853,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +clinics in laboratory medicine,0272-2712,1557-9832,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +clinics in liver disease,1089-3261,1557-8224,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +clinics in perinatology,0095-5108,1557-9840,NA,0,0,1,0,Obstetrics & Gynecology | Pediatrics,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +clinics in plastic surgery,0094-1298,1558-0504,NA,0,0,1,0,Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +clinics in podiatric medicine and surgery,0891-8422,1558-2302,NA,0,0,1,0,Orthopedics,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +clinics in sports medicine,0278-5919,1556-228X,NA,0,0,1,0,Sport Sciences,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +clio-a journal of literature history and the philosophy of history,0884-2043,0884-2043,NA,1,0,0,0,NA,NA,History | Literature | Literary Theory & Criticism | Philosophy,INDIANA UNIV-PURDUE UNIV,NA +cliometrica,1863-2505,1863-2513,NA,1,1,0,0,NA,History | Economics | History Of Social Sciences,History,SPRINGER HEIDELBERG,NA +cliometrica,1863-2505,1863-2513,NA,1,1,0,0,NA,History | Economics | History Of Social Sciences,History,SPRINGER HEIDELBERG,NA +clothing and textiles research journal,0887-302X,1940-2473,NA,0,1,0,0,NA,"Business | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +cluster computing-the journal of networks software tools and applications,1386-7857,1573-7543,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +cmc-computers materials & continua,1546-2218,1546-2226,NA,0,0,1,0,"Computer Science, Information Systems | Materials Science, Multidisciplinary",NA,NA,TECH SCIENCE PRESS,NA +cmes-computer modeling in engineering & sciences,1526-1492,1526-1506,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,TECH SCIENCE PRESS,NA +cns & neurological disorders-drug targets,1871-5273,1996-3181,NA,0,0,1,0,Neurosciences | Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL,NA +cns drugs,1172-7047,1179-1934,NA,0,0,1,0,Clinical Neurology | Pharmacology & Pharmacy | Psychiatry,NA,NA,ADIS INT LTD,NA +cns neuroscience & therapeutics,1755-5930,1755-5949,NA,0,0,1,0,Neurosciences | Pharmacology & Pharmacy,NA,NA,WILEY,NA +cns spectrums,1092-8529,2165-6509,NA,0,0,1,0,Clinical Neurology | Psychiatry,NA,NA,CAMBRIDGE UNIV PRESS,NA +co-herencia,1794-5887,2539-1208,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV EAFIT,NA +coastal engineering,0378-3839,1872-7379,NA,0,0,1,0,"Engineering, Civil | Engineering, Ocean",NA,NA,ELSEVIER,NA +coastal engineering journal,2166-4250,1793-6292,NA,0,0,1,0,"Engineering, Civil | Engineering, Ocean",NA,NA,TAYLOR & FRANCIS LTD,NA +coastal management,0892-0753,1521-0421,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,TAYLOR & FRANCIS INC,NA +coastal management,0892-0753,1521-0421,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,TAYLOR & FRANCIS INC,NA +coatings,2079-6412,2079-6412,Coatings_MDPI,0,0,1,1,"Materials Science, Multidisciplinary | Materials Science, Coatings & Films | Physics, Applied",NA,NA,MDPI,2016-07-14 +coatingstech,1547-0083,NA,NA,0,0,1,0,"Chemistry, Applied | Materials Science, Coatings & Films",NA,NA,AM COATINGS ASSOC-ACA,NA +cochrane database of systematic reviews,1469-493X,1361-6137,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,WILEY,NA +codesign-international journal of cocreation in design and the arts,1571-0882,1745-3755,CoDesignJournal,1,0,0,1,NA,NA,Art,TAYLOR & FRANCIS LTD,2014-05-06 +cogent food & agriculture,2331-1932,2331-1932,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,TAYLOR & FRANCIS AS,NA +cognition,0010-0277,1873-7838,NA,0,1,0,0,NA,"Psychology, Experimental",NA,ELSEVIER,NA +cognition & emotion,0269-9931,1464-0600,NA,0,1,0,0,NA,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cognition and instruction,0737-0008,1532-690X,COGandINSTR,0,1,0,1,NA,"Psychology, Educational | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-07-08 +cognition technology & work,1435-5558,1435-5566,NA,0,1,1,0,"Engineering, Industrial",Ergonomics,NA,SPRINGER LONDON LTD,NA +cognition technology & work,1435-5558,1435-5566,NA,0,1,1,0,"Engineering, Industrial",Ergonomics,NA,SPRINGER LONDON LTD,NA +cognitive affective & behavioral neuroscience,1530-7026,1531-135X,NA,0,0,1,0,Behavioral Sciences | Neurosciences,NA,NA,SPRINGER,NA +cognitive and behavioral neurology,1543-3633,1543-3641,NA,0,0,1,0,Behavioral Sciences | Clinical Neurology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +cognitive and behavioral practice,1077-7229,1878-187X,NA,0,1,0,0,NA,"Psychology, Clinical",NA,ELSEVIER SCIENCE INC,NA +cognitive behaviour therapy,1650-6073,1651-2316,NA,0,1,0,0,NA,"Psychology, Clinical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cognitive computation,1866-9956,1866-9964,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Neurosciences",NA,NA,SPRINGER,NA +cognitive development,0885-2014,1879-226X,NA,0,1,0,0,NA,"Psychology, Development | Psychology, Experimental",NA,ELSEVIER SCIENCE INC,NA +cognitive linguistics,0936-5907,1613-3641,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +cognitive linguistics,0936-5907,1613-3641,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +cognitive neurodynamics,1871-4080,1871-4099,NA,0,0,1,0,Neurosciences,NA,NA,SPRINGER,NA +cognitive neuropsychiatry,1354-6805,1464-0619,CogNPsychiatry,0,1,1,1,Psychiatry,Psychiatry,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-11-02 +cognitive neuropsychiatry,1354-6805,1464-0619,CogNPsychiatry,0,1,1,1,Psychiatry,Psychiatry,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-11-02 +cognitive neuropsychology,0264-3294,1464-0627,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cognitive neuropsychology,0264-3294,1464-0627,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cognitive neuroscience,1758-8928,1758-8936,NA,0,0,1,0,Neurosciences,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cognitive processing,1612-4782,1612-4790,NA,0,1,0,0,NA,"Psychology, Experimental",NA,SPRINGER HEIDELBERG,NA +cognitive psychology,0010-0285,1095-5623,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +cognitive psychology,0010-0285,1095-5623,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +cognitive research-principles and implications,2365-7464,2365-7464,NA,0,1,0,0,NA,"Psychology, Experimental",NA,SPRINGER,NA +cognitive science,0364-0213,1551-6709,NA,0,1,0,0,NA,"Psychology, Experimental",NA,WILEY,NA +cognitive systems research,2214-4366,1389-0417,NA,0,1,1,0,"Computer Science, Artificial Intelligence | Neurosciences","Psychology, Experimental",NA,ELSEVIER,NA +cognitive systems research,2214-4366,1389-0417,NA,0,1,1,0,"Computer Science, Artificial Intelligence | Neurosciences","Psychology, Experimental",NA,ELSEVIER,NA +cognitive therapy and research,0147-5916,1573-2819,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER/PLENUM PUBLISHERS,NA +cold regions science and technology,0165-232X,1872-7441,NA,0,0,1,0,"Engineering, Environmental | Engineering, Civil | Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +cold spring harbor perspectives in biology,1943-0264,1943-0264,NA,0,0,1,0,Cell Biology,NA,NA,"COLD SPRING HARBOR LAB PRESS, PUBLICATIONS DEPT",NA +cold spring harbor perspectives in medicine,2157-1422,2157-1422,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,"COLD SPRING HARBOR LAB PRESS, PUBLICATIONS DEPT",NA +cold war history,1468-2745,1743-7962,coldwarhistoryj,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-07-12 +cold war history,1468-2745,1743-7962,coldwarhistoryj,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-07-12 +coleopterists bulletin,0010-065X,1938-4394,NA,0,0,1,0,Entomology,NA,NA,COLEOPTERISTS SOC,NA +collabra-psychology,2474-7394,2474-7394,CollabraOA,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,UNIV CALIFORNIA PRESS,2014-11-03 +collectanea mathematica,0010-0757,2038-4815,CMathematica,0,0,1,1,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER-VERLAG ITALIA SRL,2018-09-19 +college & research libraries,0010-0870,2150-6701,CRL_ACRL,0,1,0,1,NA,Information Science & Library Science,NA,ASSOC COLL RESEARCH LIBRARIES,2013-08-15 +college composition and communication,0010-096X,1939-9006,NA,1,0,0,0,NA,NA,Literature,"NATL COUNCIL TEACHERS ENGLISH",NA +college english,0010-0994,2161-8178,NA,1,0,0,0,NA,NA,Literature,"NATL COUNCIL TEACHERS ENGLISH",NA +college literature,0093-3139,1542-4286,CollegeLitJrn,1,0,0,1,NA,NA,Literature,WEST CHESTER UNIV,2017-02-13 +collegian,1322-7696,1876-7575,Collegian_AU,0,1,1,1,Nursing,Nursing,NA,ELSEVIER,2018-04-17 +collegian,1322-7696,1876-7575,Collegian_AU,0,1,1,1,Nursing,Nursing,NA,ELSEVIER,2018-04-17 +colloid and interface science communications,2215-0382,2215-0382,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Coatings & Films",NA,NA,ELSEVIER,NA +colloid and polymer science,0303-402X,1435-1536,NA,0,0,1,0,"Chemistry, Physical | Polymer Science",NA,NA,SPRINGER,NA +colloid journal,1061-933X,1608-3067,NA,0,0,1,0,"Chemistry, Physical",NA,NA,PLEIADES PUBLISHING INC,NA +colloids and surfaces a-physicochemical and engineering aspects,0927-7757,1873-4359,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER,NA +colloids and surfaces b-biointerfaces,0927-7765,1873-4367,NA,0,0,1,0,"Biophysics | Chemistry, Physical | Materials Science, Biomaterials",NA,NA,ELSEVIER,NA +colloquia germanica,0010-1338,0010-1338,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian | Language & Linguistics",FRANCKE VERLAG,NA +colloquium mathematicum,0010-1354,1730-6302,NA,0,0,1,0,Mathematics,NA,NA,ARS POLONA-RUCH,NA +colombia medica,1657-9534,0120-8322,Colombia_Medica,0,0,1,1,"Medicine, General & Internal",NA,NA,CORPORACION EDITORA MEDICA VALLE,2014-02-13 +colonial latin american review,1060-9164,1466-1802,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +coloquio-letras,0010-1451,0010-1451,NA,1,0,0,0,NA,NA,"Literature, Romance | Literary Reviews",FUNDACAO CALOUSTE GULBENKIAN,NA +color research and application,0361-2317,1520-6378,NA,0,0,1,0,"Chemistry, Applied | Optics | Imaging Science & Photographic Technology",NA,NA,WILEY,NA +coloration technology,1472-3581,1478-4408,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical | Materials Science, Textiles",NA,NA,WILEY,NA +colorectal disease,1462-8910,1463-1318,ColorectalDis,0,0,1,1,Gastroenterology & Hepatology | Surgery,NA,NA,WILEY,2015-06-25 +columbia journal of law and social problems,0010-1923,0010-1923,ColumbiaJLSP,0,1,0,1,NA,Law | Social Issues,NA,COLUMBIA JOURNAL TRANSNATIONAL LAW ASSOC,2018-10-01 +columbia journal of transnational law,0010-1931,2159-1814,ColumbiaJTL,0,1,0,1,NA,International Relations | Law,NA,COLUMBIA JOURNAL TRANSNATIONAL LAW ASSOC,2013-02-14 +columbia law review,0010-1958,1945-2268,ColumLRev,0,1,0,1,NA,Law,NA,COLUMBIA JOURNAL TRANSNATIONAL LAW ASSOC,2013-03-04 +combinatorial chemistry & high throughput screening,1386-2073,1875-5402,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Applied | Pharmacology & Pharmacy",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +combinatorica,0209-9683,1439-6912,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +combinatorics probability & computing,0963-5483,1469-2163,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics | Statistics & Probability",NA,NA,CAMBRIDGE UNIV PRESS,NA +combustion and flame,0010-2180,1556-2921,NA,0,0,1,0,"Thermodynamics | Energy & Fuels | Engineering, Multidisciplinary | Engineering, Chemical | Engineering, Mechanical",NA,NA,ELSEVIER SCIENCE INC,NA +combustion explosion and shock waves,0010-5082,1573-8345,NA,0,0,1,0,"Thermodynamics | Energy & Fuels | Engineering, Multidisciplinary | Engineering, Chemical | Materials Science, Multidisciplinary",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +combustion science and technology,0010-2202,1563-521X,NA,0,0,1,0,"Thermodynamics | Energy & Fuels | Engineering, Multidisciplinary | Engineering, Chemical",NA,NA,TAYLOR & FRANCIS INC,NA +combustion theory and modelling,1364-7830,1741-3559,NA,0,0,1,0,"Thermodynamics | Energy & Fuels | Engineering, Chemical | Mathematics, Interdisciplinary Applications",NA,NA,TAYLOR & FRANCIS LTD,NA +comitatus-a journal of medieval and renaissance studies,0069-6412,1557-0290,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,UNIV CALIF CNTR MEDIEVAL RENAISSANCE STUD,NA +commentarii mathematici helvetici,0010-2571,1420-8946,NA,0,0,1,0,Mathematics,NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +comments on inorganic chemistry,0260-3594,1548-9574,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,TAYLOR & FRANCIS LTD,NA +common knowledge,0961-754X,1538-4578,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",DUKE UNIV PRESS,NA +common market law review,0165-0750,1875-8320,CMLRev,0,1,0,1,NA,International Relations | Law,NA,KLUWER LAW INT,2021-06-24 +communication & sport,2167-4795,2167-4809,commsportj,0,1,0,1,NA,"Communication | Hospitality, Leisure, Sport & Tourism",NA,SAGE PUBLICATIONS INC,2011-10-04 +communication and critical-cultural studies,1479-1420,1479-4233,NA,1,1,0,0,NA,Cultural Studies | Communication,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +communication and critical-cultural studies,1479-1420,1479-4233,NA,1,1,0,0,NA,Cultural Studies | Communication,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +communication culture & critique,1753-9129,1753-9137,NA,0,1,0,0,NA,Communication,NA,OXFORD UNIV PRESS INC,NA +communication disorders quarterly,1525-7401,1538-4837,NA,0,1,0,0,NA,Rehabilitation | Linguistics,NA,SAGE PUBLICATIONS INC,NA +communication methods and measures,1931-2458,1931-2466,NA,0,1,0,0,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +communication monographs,0363-7751,1479-5787,NA,0,1,0,0,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +communication research,0093-6502,1552-3810,NA,0,1,0,0,NA,Communication,NA,SAGE PUBLICATIONS INC,NA +communication theory,1050-3293,1468-2885,NA,0,1,0,0,NA,Communication,NA,OXFORD UNIV PRESS INC,NA +communications-european journal of communication research,0341-2059,1613-4087,commejcr,0,1,0,1,NA,Communication,NA,DE GRUYTER MOUTON,2013-09-28 +communications biology,2399-3642,2399-3642,CommsBio,0,0,1,1,Biology,NA,NA,"NATURE PORTFOLIO",2017-07-19 +communications chemistry,2399-3669,2399-3669,CommsChem,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2017-07-19 +communications in algebra,0092-7872,1532-4125,CommsAlg,0,0,1,1,Mathematics,NA,NA,TAYLOR & FRANCIS INC,2019-12-18 +communications in analysis and geometry,1019-8385,1944-9992,NA,0,0,1,0,Mathematics,NA,NA,"INT PRESS BOSTON, INC",NA +communications in applied mathematics and computational science,1559-3940,2157-5452,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,MATHEMATICAL SCIENCE PUBL,NA +communications in computational physics,1815-2406,1991-7120,NA,0,0,1,0,"Physics, Mathematical",NA,NA,GLOBAL SCIENCE PRESS,NA +communications in contemporary mathematics,0219-1997,1793-6683,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +communications in mathematical physics,0010-3616,1432-0916,NA,0,0,1,0,"Physics, Mathematical",NA,NA,SPRINGER,NA +communications in mathematical sciences,1539-6746,1539-6746,NA,0,0,1,0,"Mathematics, Applied",NA,NA,"INT PRESS BOSTON, INC",NA +communications in mathematics and statistics,2194-6701,2194-671X,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +communications in nonlinear science and numerical simulation,1007-5704,1878-7274,NA,0,0,1,0,"Mathematics, Applied | Mathematics, Interdisciplinary Applications | Mechanics | Physics, Fluids & Plasmas | Physics, Mathematical",NA,NA,ELSEVIER,NA +communications in number theory and physics,1931-4523,1931-4531,NA,0,0,1,0,"Mathematics, Applied | Mathematics | Physics, Mathematical",NA,NA,"INT PRESS BOSTON, INC",NA +communications in partial differential equations,0360-5302,1532-4133,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,TAYLOR & FRANCIS INC,NA +communications in soil science and plant analysis,0010-3624,1532-2416,NA,0,0,1,0,"Agronomy | Plant Sciences | Chemistry, Analytical | Soil Science",NA,NA,TAYLOR & FRANCIS INC,NA +communications in statistics-simulation and computation,0361-0918,1532-4141,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +communications in statistics-theory and methods,0361-0926,1532-415X,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +communications in theoretical physics,0253-6102,1572-9494,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +communications of the acm,0001-0782,1557-7317,CACMmag,0,0,1,1,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,ASSOC COMPUTING MACHINERY,2009-10-22 +communications on pure and applied analysis,1534-0392,1553-5258,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +communications on pure and applied mathematics,0010-3640,1097-0312,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WILEY,NA +communications physics,2399-3650,2399-3650,CommsPhys,0,0,1,1,"Physics, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2017-07-19 +communio viatorum,0010-3713,NA,NA,1,0,0,0,NA,NA,Religion,UNIV KARLOVA PRAZE,NA +communist and post-communist studies,0967-067X,1873-6920,cpcs_journal,0,1,0,1,NA,International Relations | Political Science,NA,UNIV CALIFORNIA PRESS,2020-11-12 +community dental health,0265-539X,0265-539X,CDHJournal,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,F D I WORLD DENTAL PRESS LTD,2019-12-03 +community dentistry and oral epidemiology,0301-5661,1600-0528,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Public, Environmental & Occupational Health",NA,NA,WILEY,NA +community development journal,0010-3802,1468-2656,cdjplus,0,1,0,1,NA,Development Studies,NA,OXFORD UNIV PRESS,2013-04-12 +community ecology,1585-8553,1588-2756,NA,0,0,1,0,Ecology,NA,NA,SPRINGER HEIDELBERG,NA +community mental health journal,0010-3853,1573-2789,CommunityMenta2,0,1,0,1,NA,"Health Policy & Services | Public, Environmental & Occupational Health | Psychiatry",NA,SPRINGER,2021-01-26 +comparative biochemistry and physiology a-molecular & integrative physiology,1095-6433,1531-4332,NA,0,0,1,0,Biochemistry & Molecular Biology | Physiology | Zoology,NA,NA,ELSEVIER SCIENCE INC,NA +comparative biochemistry and physiology b-biochemistry & molecular biology,1096-4959,1879-1107,NA,0,0,1,0,Biochemistry & Molecular Biology | Zoology,NA,NA,ELSEVIER SCIENCE INC,NA +comparative biochemistry and physiology c-toxicology & pharmacology,1532-0456,1878-1659,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism | Toxicology | Zoology,NA,NA,ELSEVIER SCIENCE INC,NA +comparative biochemistry and physiology d-genomics & proteomics,1744-117X,1878-0407,NA,0,0,1,0,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,ELSEVIER SCIENCE INC,NA +comparative critical studies,1744-1854,1750-0109,NA,1,0,0,0,NA,NA,Literature,EDINBURGH UNIV PRESS,NA +comparative cytogenetics,1993-0771,1993-078X,NA,0,0,1,0,Plant Sciences | Genetics & Heredity | Zoology,NA,NA,PENSOFT PUBLISHERS,NA +comparative drama,0010-4078,1936-1637,NA,1,0,0,0,NA,NA,Theater,WESTERN MICHIGAN UNIV,NA +comparative education,0305-0068,1360-0486,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +comparative education review,0010-4086,1545-701X,CERJournal,0,1,0,1,NA,Education & Educational Research,NA,UNIV CHICAGO PRESS,2016-03-29 +comparative european politics,1472-4790,1740-388X,CompEurPol_Jnl,0,1,0,1,NA,Political Science,NA,PALGRAVE MACMILLAN LTD,2019-02-12 +comparative immunology microbiology and infectious diseases,0147-9571,1878-1667,NA,0,0,1,0,Immunology | Microbiology | Veterinary Sciences,NA,NA,ELSEVIER SCI LTD,NA +comparative literature,0010-4124,1945-8517,CompLit_Journal,1,0,0,1,NA,NA,Literature,DUKE UNIV PRESS,2018-10-09 +comparative literature studies,0010-4132,1528-4212,NA,1,0,0,0,NA,NA,Literature,PENN STATE UNIV PRESS,NA +comparative medicine,1532-0820,1532-0820,NA,0,0,1,0,Veterinary Sciences | Zoology,NA,NA,AMER ASSOC LABORATORY ANIMAL SCIENCE,NA +comparative migration studies,2214-594X,2214-594X,JournalCMS,0,1,0,1,NA,Demography,NA,SPRINGERNATURE,2012-10-15 +comparative parasitology,1525-2647,1938-2952,NA,0,0,1,0,Parasitology | Zoology,NA,NA,HELMINTHOLOGICAL SOC WASHINGTON,NA +comparative political studies,0010-4140,1552-3829,cps_journal,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS INC,2020-07-21 +comparative politics,0010-4159,2151-6227,journal_comppol,0,1,0,1,NA,Political Science,NA,SHERIDAN PRESS,2018-03-30 +comparative studies in society and history,0010-4175,1475-2999,csshjournal,1,1,0,1,NA,History | Anthropology | Sociology,History,CAMBRIDGE UNIV PRESS,2017-02-26 +comparative studies in society and history,0010-4175,1475-2999,csshjournal,1,1,0,1,NA,History | Anthropology | Sociology,History,CAMBRIDGE UNIV PRESS,2017-02-26 +compare-a journal of comparative and international education,0305-7925,1469-3623,COMPARE_Journal,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-05-01 +compel-the international journal for computation and mathematics in electrical and electronic engineering,0332-1649,0332-1649,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Electrical & Electronic | Mathematics, Applied",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +competition & change,1024-5294,1477-2221,CompChange,0,1,0,1,NA,Business | Economics | Geography,NA,SAGE PUBLICATIONS LTD,2019-01-22 +complementary medicine research,2504-2092,2504-2106,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,KARGER,NA +complementary therapies in clinical practice,1744-3881,1873-6947,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,ELSEVIER SCI LTD,NA +complementary therapies in medicine,0965-2299,1873-6963,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,CHURCHILL LIVINGSTONE,NA +complex & intelligent systems,2199-4536,2198-6053,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER HEIDELBERG,NA +complex analysis and operator theory,1661-8254,1661-8262,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +complex variables and elliptic equations,1747-6933,1747-6941,NA,0,0,1,0,Mathematics,NA,NA,TAYLOR & FRANCIS LTD,NA +complexity,1076-2787,1099-0526,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Multidisciplinary Sciences",NA,NA,WILEY-HINDAWI,NA +complutum,1131-6993,1988-2327,NA,1,0,0,0,NA,NA,Archaeology,"UNIV COMPLUTENSE MADRID, SERVICIO PUBLICACIONES",NA +composite interfaces,0927-6440,1568-5543,NA,0,0,1,0,"Materials Science, Composites",NA,NA,TAYLOR & FRANCIS LTD,NA +composite structures,0263-8223,1879-1085,NA,0,0,1,0,"Mechanics | Materials Science, Composites",NA,NA,ELSEVIER SCI LTD,NA +composites and advanced materials,NA,2634-9833,NA,0,0,1,0,"Materials Science, Composites",NA,NA,SAGE PUBLICATIONS LTD,NA +composites communications,2452-2139,2452-2139,NA,0,0,1,0,"Materials Science, Composites",NA,NA,ELSEVIER SCI LTD,NA +composites part a-applied science and manufacturing,1359-835X,1878-5840,NA,0,0,1,0,"Engineering, Manufacturing | Materials Science, Composites",NA,NA,ELSEVIER SCI LTD,NA +composites part b-engineering,1359-8368,1879-1069,NA,0,0,1,0,"Engineering, Multidisciplinary | Materials Science, Composites",NA,NA,ELSEVIER SCI LTD,NA +composites science and technology,0266-3538,1879-1050,NA,0,0,1,0,"Materials Science, Composites",NA,NA,ELSEVIER SCI LTD,NA +compositio mathematica,0010-437X,1570-5846,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +compost science & utilization,1065-657X,2326-2397,NA,0,0,1,0,Ecology | Soil Science,NA,NA,TAYLOR & FRANCIS INC,NA +comprehensive physiology,2040-4603,2040-4603,NA,0,0,1,0,Physiology,NA,NA,WILEY,NA +comprehensive psychiatry,0010-440X,1532-8384,ComprPsychiatry,0,1,1,1,Psychiatry,Psychiatry,NA,W B SAUNDERS CO-ELSEVIER INC,2019-04-02 +comprehensive psychiatry,0010-440X,1532-8384,ComprPsychiatry,0,1,1,1,Psychiatry,Psychiatry,NA,W B SAUNDERS CO-ELSEVIER INC,2019-04-02 +comprehensive reviews in food science and food safety,1541-4337,1541-4337,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +comptabilite controle audit,1262-2788,NA,NA,0,1,0,0,NA,"Business, Finance",NA,ASSOC FRANCOPHONE COMPTABILITE-AFC,NA +comptes rendus biologies,1631-0691,1768-3238,NA,0,0,1,0,Biology,NA,NA,CENTRE MERSENNE POUR L’ÉDITION SCIENTIFIQUE OUVERTE,NA +comptes rendus chimie,1631-0748,1878-1543,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CENTRE MERSENNE POUR L’ÉDITION SCIENTIFIQUE OUVERTE,NA +comptes rendus de l academie bulgare des sciences,1310-1331,NA,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,PUBL HOUSE BULGARIAN ACAD SCI,NA +comptes rendus des seances de l academie des inscriptions & belles-lettres,0065-0536,NA,NA,1,0,0,0,NA,NA,Art,DIFFUSION DE BOCCARD,NA +comptes rendus geoscience,1631-0713,1778-7025,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,CENTRE MERSENNE POUR L’ÉDITION SCIENTIFIQUE OUVERTE,NA +comptes rendus mathematique,1631-073X,1778-3569,NA,0,0,1,0,Mathematics,NA,NA,CENTRE MERSENNE POUR L’ÉDITION SCIENTIFIQUE OUVERTE,NA +comptes rendus mecanique,1631-0721,1873-7234,NA,0,0,1,0,Mechanics,NA,NA,CENTRE MERSENNE POUR L’ÉDITION SCIENTIFIQUE OUVERTE,NA +comptes rendus palevol,1631-0683,1777-571X,NA,0,0,1,0,Paleontology,NA,NA,MUSEUM NATL HISTOIRE NATURELLE,NA +comptes rendus physique,1631-0705,1878-1535,NA,0,0,1,0,"Astronomy & Astrophysics | Physics, Multidisciplinary",NA,NA,CENTRE MERSENNE POUR L’ÉDITION SCIENTIFIQUE OUVERTE,NA +computational & applied mathematics,2238-3603,1807-0302,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +computational and mathematical methods in medicine,1748-670X,1748-6718,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,HINDAWI LTD,NA +computational and mathematical organization theory,1381-298X,1572-9346,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications | Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods",NA,SPRINGER,NA +computational and mathematical organization theory,1381-298X,1572-9346,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications | Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods",NA,SPRINGER,NA +computational and structural biotechnology journal,2001-0370,2001-0370,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,ELSEVIER,NA +computational and theoretical chemistry,2210-271X,1872-7999,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER,NA +computational biology and chemistry,1476-9271,1476-928X,NA,0,0,1,0,"Biology | Computer Science, Interdisciplinary Applications",NA,NA,ELSEVIER SCI LTD,NA +computational complexity,1016-3328,1420-8954,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics",NA,NA,SPRINGER BASEL AG,NA +computational economics,0927-7099,1572-9974,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications",Economics | Management,NA,SPRINGER,NA +computational economics,0927-7099,1572-9974,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications",Economics | Management,NA,SPRINGER,NA +computational geometry-theory and applications,0925-7721,1879-081X,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ELSEVIER,NA +computational geosciences,1420-0597,1573-1499,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +computational intelligence,0824-7935,1467-8640,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,WILEY,NA +computational intelligence and neuroscience,1687-5265,1687-5273,NA,0,0,1,0,Mathematical & Computational Biology | Neurosciences,NA,NA,HINDAWI LTD,NA +computational linguistics,0891-2017,1530-9312,NA,1,1,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",Linguistics,Language & Linguistics,MIT PRESS,NA +computational linguistics,0891-2017,1530-9312,NA,1,1,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",Linguistics,Language & Linguistics,MIT PRESS,NA +computational linguistics,0891-2017,1530-9312,NA,1,1,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",Linguistics,Language & Linguistics,MIT PRESS,NA +computational materials science,0927-0256,1879-0801,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +computational mathematics and mathematical physics,0965-5425,1555-6662,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,PLEIADES PUBLISHING INC,NA +computational mechanics,0178-7675,1432-0924,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Mechanics",NA,NA,SPRINGER,NA +computational methods and function theory,1617-9447,2195-3724,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER HEIDELBERG,NA +computational methods in applied mathematics,1609-4840,1609-9389,NA,0,0,1,0,"Mathematics, Applied",NA,NA,WALTER DE GRUYTER GMBH,NA +computational optimization and applications,0926-6003,1573-2894,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,SPRINGER,NA +computational particle mechanics,2196-4378,2196-4386,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Mechanics",NA,NA,SPRINGER INT PUBL AG,NA +computational statistics,0943-4062,1613-9658,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER HEIDELBERG,NA +computational statistics & data analysis,0167-9473,1872-7352,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Statistics & Probability",NA,NA,ELSEVIER,NA +computational visual media,2096-0433,2096-0662,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,SPRINGERNATURE,NA +computer,0018-9162,1558-0814,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,NA +computer-aided civil and infrastructure engineering,1093-9687,1467-8667,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Construction & Building Technology | Engineering, Civil | Transportation Science & Technology",NA,NA,WILEY,NA +computer-aided design,0010-4485,1879-2685,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,ELSEVIER SCI LTD,NA +computer aided geometric design,0167-8396,1879-2332,NA,0,0,1,0,"Computer Science, Software Engineering | Mathematics, Applied",NA,NA,ELSEVIER,NA +computer animation and virtual worlds,1546-4261,1546-427X,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,WILEY,NA +computer applications in engineering education,1061-3773,1099-0542,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Education, Scientific Disciplines | Engineering, Multidisciplinary",NA,NA,WILEY,NA +computer assisted language learning,0958-8221,1744-3210,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +computer assisted language learning,0958-8221,1744-3210,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +computer assisted surgery,2469-9322,2469-9322,NA,0,0,1,0,Surgery,NA,NA,TAYLOR & FRANCIS LTD,NA +computer communications,0140-3664,1873-703X,comcom_journal,0,0,1,1,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,ELSEVIER,2020-06-19 +computer graphics forum,0167-7055,1467-8659,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,WILEY,NA +computer journal,0010-4620,1460-2067,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,OXFORD UNIV PRESS,NA +computer law & security review,0267-3649,0267-3649,complawsecrev,0,1,0,1,NA,Law,NA,ELSEVIER ADVANCED TECHNOLOGY,2020-02-02 +computer methods and programs in biomedicine,0169-2607,1872-7565,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Theory & Methods | Engineering, Biomedical | Medical Informatics",NA,NA,ELSEVIER IRELAND LTD,NA +computer methods in applied mechanics and engineering,0045-7825,1879-2138,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications | Mechanics",NA,NA,ELSEVIER SCIENCE SA,NA +computer methods in biomechanics and biomedical engineering,1025-5842,1476-8259,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Biomedical",NA,NA,TAYLOR & FRANCIS LTD,NA +computer music journal,0148-9267,1531-5169,NA,1,0,1,0,"Computer Science, Interdisciplinary Applications",NA,Music,MIT PRESS,NA +computer music journal,0148-9267,1531-5169,NA,1,0,1,0,"Computer Science, Interdisciplinary Applications",NA,Music,MIT PRESS,NA +computer networks,1389-1286,1872-7069,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,ELSEVIER,NA +computer physics communications,0010-4655,1879-2944,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Physics, Mathematical",NA,NA,ELSEVIER,NA +computer science and information systems,1820-0214,1820-0214,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,COMSIS CONSORTIUM,NA +computer science review,1574-0137,1876-7745,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +computer speech and language,0885-2308,1095-8363,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +computer standards & interfaces,0920-5489,1872-7018,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,ELSEVIER,NA +computer supported cooperative work-the journal of collaborative computing and work practices,0925-9724,1573-7551,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications",NA,NA,SPRINGER,NA +computer systems science and engineering,0267-6192,NA,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods",NA,NA,TECH SCIENCE PRESS,NA +computer vision and image understanding,1077-3142,1090-235X,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +computerized medical imaging and graphics,0895-6111,1879-0771,NA,0,0,1,0,"Engineering, Biomedical | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & chemical engineering,0098-1354,1873-4375,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Chemical",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & education,0360-1315,1873-782X,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications",Education & Educational Research,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & education,0360-1315,1873-782X,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications",Education & Educational Research,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & electrical engineering,0045-7906,1879-0755,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Interdisciplinary Applications | Engineering, Electrical & Electronic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & fluids,0045-7930,1879-0747,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Mechanics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & geosciences,0098-3004,1873-7803,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Geosciences, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & graphics-uk,0097-8493,1873-7684,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & industrial engineering,0360-8352,1879-0550,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Industrial",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & mathematics with applications,0898-1221,1873-7668,NA,0,0,1,0,"Mathematics, Applied",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & operations research,0305-0548,1873-765X,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Industrial | Operations Research & Management Science",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers & security,0167-4048,1872-6208,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,ELSEVIER ADVANCED TECHNOLOGY,NA +computers & structures,0045-7949,1879-2243,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Civil",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers and concrete,1598-8198,1598-818X,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Construction & Building Technology | Engineering, Civil | Materials Science, Characterization, Testing",NA,NA,TECHNO-PRESS,NA +computers and electronics in agriculture,0168-1699,1872-7107,NA,0,0,1,0,"Agriculture, Multidisciplinary | Computer Science, Interdisciplinary Applications",NA,NA,ELSEVIER SCI LTD,NA +computers and geotechnics,0266-352X,1873-7633,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +computers environment and urban systems,0198-9715,1873-7587,NA,0,1,0,0,NA,Environmental Studies | Geography | Regional & Urban Planning,NA,ELSEVIER SCI LTD,NA +computers in biology and medicine,0010-4825,1879-0534,NA,0,0,1,0,"Biology | Computer Science, Interdisciplinary Applications | Engineering, Biomedical | Mathematical & Computational Biology",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers in human behavior,0747-5632,1873-7692,NA,0,1,0,0,NA,"Psychology, Multidisciplinary | Psychology, Experimental",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +computers in industry,0166-3615,1872-6194,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications",NA,NA,ELSEVIER,NA +computing,0010-485X,1436-5057,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,SPRINGER WIEN,NA +computing and informatics,1335-9150,1335-9150,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SLOVAK ACAD SCIENCES INST INFORMATICS,NA +computing in science & engineering,1521-9615,1558-366X,cisemag,0,0,1,1,"Computer Science, Interdisciplinary Applications",NA,NA,IEEE COMPUTER SOC,2009-07-30 +comunicar,1134-3478,1988-3293,Rev_Comunicar,0,1,0,1,NA,Communication | Education & Educational Research,NA,GRUPO COMUNICAR,2011-01-03 +concentric-literary and cultural studies,1729-6897,1729-8792,NA,1,0,0,0,NA,NA,Literature | Literary Theory & Criticism,"NATL TAIWAN NORMAL UNIV, COLL INT STUDIES & SOCIAL SCIENCES",NA +concepts in magnetic resonance part a,1546-6086,1552-5023,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical | Radiology, Nuclear Medicine & Medical Imaging | Spectroscopy",NA,NA,WILEY-HINDAWI,NA +concepts in magnetic resonance part b-magnetic resonance engineering,1552-5031,1552-504X,NA,0,0,1,0,"Chemistry, Physical | Instruments & Instrumentation | Physics, Atomic, Molecular & Chemical | Spectroscopy",NA,NA,WILEY-HINDAWI,NA +concurrency and computation-practice & experience,1532-0626,1532-0634,NA,0,0,1,0,"Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,WILEY,NA +concurrent engineering-research and applications,1063-293X,1531-2003,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Manufacturing | Operations Research & Management Science",NA,NA,SAGE PUBLICATIONS LTD,NA +condensed matter physics,1607-324X,2224-9079,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,INST CONDENSED MATTER PHYSICS NATL ACAD SCIENCES UKRAINE,NA +configurations,1063-1801,1080-6520,NA,1,0,0,0,NA,NA,History & Philosophy Of Science | Literature,JOHNS HOPKINS UNIV PRESS,NA +conflict and health,1752-1505,1752-1505,Conflict_Health,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,2014-01-16 +conflict and health,1752-1505,1752-1505,Conflict_Health,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,2014-01-16 +conflict management and peace science,0738-8942,1549-9219,cmpseditors,0,1,0,1,NA,International Relations,NA,SAGE PUBLICATIONS INC,2019-11-11 +confluencia-revista hispanica de cultura y literatura,0888-6091,2328-6962,NA,1,0,0,0,NA,NA,"Literary Theory & Criticism | Literature, Romance",COLORADO STATE UNIV,NA +confrontation,0010-5716,NA,NA,1,0,0,0,NA,NA,Literary Reviews,"LONG ISLAND UNIV, CW POST COLL",NA +congenital anomalies,0914-3505,1741-4520,NA,0,0,1,0,Pediatrics,NA,NA,WILEY,NA +congenital heart disease,1747-079X,1747-0803,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,TECH SCIENCE PRESS,NA +connaissance des arts,0293-9274,0293-9274,Cdesarts,1,0,0,1,NA,NA,Art,SFPA-CONNAISSANCE ARTS,2010-03-07 +connection science,0954-0091,1360-0494,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,TAYLOR & FRANCIS LTD,NA +connective tissue research,0300-8207,1607-8438,NA,0,0,1,0,Cell Biology | Orthopedics,NA,NA,TAYLOR & FRANCIS INC,NA +conradiana,0010-6356,1935-0252,NA,1,0,0,0,NA,NA,"Literature, British Isles",TEXAS TECH UNIV PRESS,NA +consciousness and cognition,1053-8100,1090-2376,NA,0,1,0,0,NA,"Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +conservation & society,0972-4923,0975-3133,ConservandSoc,0,1,0,1,NA,Environmental Studies,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2018-01-10 +conservation and management of archaeological sites,1350-5033,1753-5522,NA,1,0,0,0,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +conservation biology,0888-8892,1523-1739,ConBiology,0,0,1,1,Biodiversity Conservation | Ecology | Environmental Sciences,NA,NA,WILEY,2013-07-20 +conservation genetics,1566-0621,1572-9737,NA,0,0,1,0,Biodiversity Conservation | Genetics & Heredity,NA,NA,SPRINGER,NA +conservation genetics resources,1877-7252,1877-7260,NA,0,0,1,0,Biodiversity Conservation | Genetics & Heredity,NA,NA,SPRINGER,NA +conservation letters,1755-263X,1755-263X,ConLetters,0,0,1,1,Biodiversity Conservation,NA,NA,WILEY,2009-06-18 +conservation physiology,2051-1434,2051-1434,conphysjournal,0,0,1,1,Biodiversity Conservation | Ecology | Environmental Sciences | Physiology,NA,NA,OXFORD UNIV PRESS,2016-04-15 +conservation science and practice,2578-4854,2578-4854,ConservationSP,0,0,1,1,Biodiversity Conservation,NA,NA,WILEY,2018-06-06 +constraints,1383-7133,1572-9354,constraints_cp,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,SPRINGER,2015-01-16 +construction and building materials,0950-0618,1879-0526,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +construction history-international journal of the construction history society,0267-7768,NA,NA,1,0,0,0,NA,NA,History | Architecture,CONSTRUCTION HISTORY SOC,NA +constructive approximation,0176-4276,1432-0940,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +constructivist foundations,1782-348X,NA,NA,1,0,0,0,NA,NA,Philosophy,ALEXANDER RIEGLER,NA +consumption markets & culture,1025-3866,1477-223X,CMCjournal,0,1,0,1,NA,Business,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-09-21 +contact dermatitis,0105-1873,1600-0536,NA,0,0,1,0,Allergy | Dermatology,NA,NA,WILEY,NA +contact lens & anterior eye,1367-0484,1476-5411,NA,0,0,1,0,Ophthalmology,NA,NA,ELSEVIER,NA +contemporanea,1127-3070,1127-3070,NA,1,0,0,0,NA,NA,History,SOC ED IL MULINO,NA +contemporary accounting research,0823-9150,1911-3846,CAR_RCC_Journal,0,1,0,1,NA,"Business, Finance",NA,WILEY,2021-01-29 +contemporary british history,1361-9462,1743-7997,CBHJournal,1,0,0,1,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-04-30 +contemporary buddhism,1463-9947,1476-7953,NA,1,0,0,0,NA,NA,Religion | Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +contemporary chinese thought,1097-1467,1558-0997,NA,1,0,0,0,NA,NA,Philosophy | Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +contemporary clinical trials,1551-7144,1559-2030,NA,0,0,1,0,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,ELSEVIER SCIENCE INC,NA +contemporary economic policy,1074-3529,1465-7287,CEP_WEAI,0,1,0,1,NA,Economics | Public Administration,NA,WILEY,2020-08-03 +contemporary educational psychology,0361-476X,1090-2384,NA,0,1,0,0,NA,"Psychology, Educational",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +contemporary european history,0960-7773,1469-2171,conteurohistory,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2016-02-05 +contemporary european history,0960-7773,1469-2171,conteurohistory,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2016-02-05 +contemporary french and francophone studies,1740-9292,1740-9306,NA,1,0,0,0,NA,NA,"Literature, Romance","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +contemporary literature,0010-7484,1548-9949,C_L_Journal,1,0,0,1,NA,NA,Literature,UNIV WISCONSIN PRESS,2018-05-07 +contemporary music review,0749-4467,1477-2256,NA,1,0,0,0,NA,NA,Music,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +contemporary nurse,1037-6178,1839-3535,AdvContNurs,0,1,1,1,Nursing,Nursing,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2010-11-05 +contemporary nurse,1037-6178,1839-3535,AdvContNurs,0,1,1,1,Nursing,Nursing,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2010-11-05 +contemporary pacific,1043-898X,1527-9464,NA,0,1,0,0,NA,Area Studies,NA,UNIV HAWAII PRESS,NA +contemporary physics,0010-7514,1366-5812,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +contemporary political theory,1470-8914,1476-9336,NA,0,1,0,0,NA,Political Science,NA,PALGRAVE MACMILLAN LTD,NA +contemporary politics,1356-9775,1469-3631,NA,0,1,0,0,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +contemporary pragmatism,1572-3429,1875-8185,NA,1,0,0,0,NA,NA,Philosophy,BRILL,NA +contemporary problems of ecology,1995-4255,1995-4263,NA,0,0,1,0,Ecology,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +contemporary psychoanalysis,0010-7530,2330-9091,NA,0,1,0,0,NA,"Psychiatry | Psychology, Psychoanalysis",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +contemporary security policy,1352-3260,1743-8764,csp_journal,0,1,0,1,NA,International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-01-07 +contemporary sociology-a journal of reviews,0094-3061,1939-8638,ContemporarySoc,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS INC,2021-09-09 +contemporary south asia,0958-4935,1469-364X,contemporarySA,1,0,0,1,NA,NA,Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-04-29 +contemporary southeast asia,0129-797X,1793-284X,contemporarysa,0,1,0,1,NA,Area Studies | International Relations | Political Science,NA,INST SOUTHEAST ASIAN STUDIES-ISEAS,2015-04-29 +contemporary theatre review,1048-6801,1477-2264,NA,1,0,0,0,NA,NA,Theater,TAYLOR & FRANCIS LTD,NA +contemporary womens writing,1754-1476,1754-1484,NA,1,0,0,0,NA,NA,Literature,OXFORD UNIV PRESS,NA +continental philosophy review,1387-2842,1573-1103,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +continental shelf research,0278-4343,1873-6955,NA,0,0,1,0,Oceanography,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +continuity and change,0268-4160,1469-218X,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,CAMBRIDGE UNIV PRESS,NA +continuum-journal of media & cultural studies,1030-4312,1469-3666,ContinuumJMCS,1,1,0,1,NA,Cultural Studies | Communication,"Film, Radio, Television | Cultural Studies","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-02-14 +continuum-journal of media & cultural studies,1030-4312,1469-3666,ContinuumJMCS,1,1,0,1,NA,Cultural Studies | Communication,"Film, Radio, Television | Cultural Studies","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-02-14 +continuum mechanics and thermodynamics,0935-1175,1432-0959,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,SPRINGER,NA +contraception,0010-7824,1879-0518,ContraceptionJL,0,0,1,1,Obstetrics & Gynecology,NA,NA,ELSEVIER SCIENCE INC,2016-05-26 +contrast media & molecular imaging,1555-4309,1555-4317,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY-HINDAWI,NA +contributions of the astronomical observatory skalnate pleso,1335-1842,1336-0337,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,SLOVAK ACADEMY SCIENCES ASTRONOMICAL INST,NA +contributions to discrete mathematics,1715-0868,1715-0868,NA,0,0,1,0,Mathematics,NA,NA,"UNIV CALGARY, DEPT MATH & STATISTICS",NA +contributions to indian sociology,0069-9667,0973-0648,NA,0,1,0,0,NA,Sociology,NA,SAGE PUBLICATIONS INDIA PVT LTD,NA +contributions to mineralogy and petrology,0010-7999,1432-0967,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,SPRINGER,NA +contributions to nephrology,0302-5144,1662-2782,NA,0,0,1,0,Urology & Nephrology,NA,NA,KARGER,NA +contributions to plasma physics,0863-1042,1521-3986,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,WILEY-V C H VERLAG GMBH,NA +contributions to zoology,1383-4517,1875-9866,NA,0,0,1,0,Zoology,NA,NA,BRILL,NA +control engineering and applied informatics,1454-8658,NA,NA,0,0,1,0,Automation & Control Systems,NA,NA,ROMANIAN SOC CONTROL TECH INFORMATICS,NA +control engineering practice,0967-0661,1873-6939,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +convergence-the international journal of research into new media technologies,1354-8565,1748-7382,Convergence_NMT,0,1,0,1,NA,Communication,NA,SAGE PUBLICATIONS INC,2017-12-11 +convergencia-revista de ciencias sociales,2448-5799,2448-5799,ConvergenciaRev,0,1,0,1,NA,Sociology,NA,UNIV AUTONOMA ESTADO MEXICO,2013-06-03 +convivium,0010-8235,2255-2855,ConviviumProj,1,0,0,1,NA,NA,Philosophy,"UNIV BARCELONA, FACULTAD FILOLOGIA",2011-10-13 +cooperation and conflict,0010-8367,1460-3691,CoCo_journal,0,1,0,1,NA,International Relations | Political Science,NA,SAGE PUBLICATIONS LTD,2020-10-20 +coordination chemistry reviews,0010-8545,1873-3840,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,ELSEVIER SCIENCE SA,NA +copd-journal of chronic obstructive pulmonary disease,1541-2555,1541-2563,COPDJournal,0,0,1,1,Respiratory System,NA,NA,TAYLOR & FRANCIS INC,2010-06-18 +coral reefs,0722-4028,1432-0975,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,SPRINGER,NA +cornea,0277-3740,1536-4798,CorneaJournal,0,0,1,1,Ophthalmology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-06-20 +cornell hospitality quarterly,1938-9655,1938-9663,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Management | Sociology",NA,SAGE PUBLICATIONS INC,NA +cornell international law journal,0010-8812,1930-7977,cornell_ilj,0,1,0,1,NA,International Relations | Law,NA,CORNELL INT LAW JOURNAL,2013-08-09 +cornell law review,0010-8847,0010-8847,cornell_law_rev,0,1,0,1,NA,Law,NA,CORNELL LAW REVIEW,2010-07-21 +coronary artery disease,0954-6928,1473-5830,CoronaryArteryD,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2012-06-21 +corporate governance-an international review,0964-8410,1467-8683,NA,0,1,0,0,NA,"Business | Business, Finance | Management",NA,WILEY,NA +corporate social responsibility and environmental management,1535-3958,1535-3966,NA,0,1,0,0,NA,Business | Environmental Studies | Management,NA,WILEY,NA +corpus linguistics and linguistic theory,1613-7027,1613-7035,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +corpus linguistics and linguistic theory,1613-7027,1613-7035,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +correspondances en metabolismes hormones diabetes et nutrition,2100-9619,NA,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,EDIMARK SANTE,NA +corrosion,0010-9312,1938-159X,CorrosionJnl,0,0,1,1,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,"NATL ASSOC CORROSION ENG",2016-02-05 +corrosion engineering science and technology,1478-422X,1743-2782,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,TAYLOR & FRANCIS LTD,NA +corrosion reviews,0334-6005,2191-0316,NA,0,0,1,0,"Electrochemistry | Metallurgy & Metallurgical Engineering | Materials Science, Coatings & Films",NA,NA,WALTER DE GRUYTER GMBH,NA +corrosion science,0010-938X,1879-0496,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +cortex,0010-9452,1973-8102,CORTEXjournal,0,1,1,1,Behavioral Sciences | Neurosciences,"Psychology, Experimental",NA,"ELSEVIER MASSON, CORPORATION OFFICE",2020-10-21 +cortex,0010-9452,1973-8102,CORTEXjournal,0,1,1,1,Behavioral Sciences | Neurosciences,"Psychology, Experimental",NA,"ELSEVIER MASSON, CORPORATION OFFICE",2020-10-21 +cosmic research,0010-9525,1608-3075,NA,0,0,1,0,"Engineering, Aerospace | Astronomy & Astrophysics",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +cost effectiveness and resource allocation,1478-7547,1478-7547,NA,0,1,0,0,NA,Health Policy & Services,NA,BMC,NA +costume-the journal of the costume society,0590-8876,1749-6306,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",EDINBURGH UNIV PRESS,NA +counseling psychologist,0011-0000,1552-3861,NA,0,1,0,0,NA,"Psychology, Applied",NA,SAGE PUBLICATIONS INC,NA +cpt-pharmacometrics & systems pharmacology,2163-8306,2163-8306,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,WILEY,NA +cr-the new centennial review,1532-687X,1539-6630,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",MICHIGAN STATE UNIV PRESS,NA +cranio-the journal of craniomandibular & sleep practice,0886-9634,2151-0903,CRANIOJournal,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,TAYLOR & FRANCIS LTD,2011-01-13 +creativity and innovation management,0963-1690,1467-8691,NA,0,1,0,0,NA,Management,NA,WILEY,NA +creativity research journal,1040-0419,1532-6934,NA,0,1,0,0,NA,"Psychology, Educational | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cretaceous research,0195-6671,1095-998X,NA,0,0,1,0,Geology | Paleontology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +crime & delinquency,0011-1287,1552-387X,CandD_Journal,0,1,0,1,NA,Criminology & Penology,NA,SAGE PUBLICATIONS INC,2020-01-31 +crime and justice-a review of research,0192-3234,2153-0416,NA,0,1,0,0,NA,Criminology & Penology,NA,UNIV CHICAGO PRESS,NA +crime law and social change,0925-4994,1573-0751,NA,0,1,0,0,NA,"Criminology & Penology | Social Sciences, Interdisciplinary",NA,SPRINGER,NA +crime media culture,1741-6590,1741-6604,CultureCrime,0,1,0,1,NA,Criminology & Penology | Sociology,NA,SAGE PUBLICATIONS LTD,2019-12-03 +criminal behaviour and mental health,0957-9664,1471-2857,NA,0,1,0,0,NA,Criminology & Penology | Psychiatry,NA,WILEY,NA +criminal justice and behavior,0093-8548,1552-3594,CJB_Journal,0,1,0,1,NA,"Psychology, Clinical | Criminology & Penology",NA,SAGE PUBLICATIONS INC,2021-12-14 +criminology,0011-1384,1745-9125,NA,0,1,0,0,NA,Criminology & Penology,NA,WILEY,NA +criminology & criminal justice,1748-8958,1748-8966,Crim__Justice,0,1,0,1,NA,Criminology & Penology,NA,SAGE PUBLICATIONS LTD,2021-01-14 +criminology & public policy,1538-6473,1745-9133,CPPJournal,0,1,0,1,NA,Criminology & Penology,NA,WILEY,2019-01-28 +crisis-the journal of crisis intervention and suicide prevention,0227-5910,2151-2396,NA,0,1,0,0,NA,"Psychiatry | Psychology, Multidisciplinary",NA,HOGREFE PUBLISHING CORP,NA +crispr journal,2573-1599,2573-1602,CRISPRjournal,0,0,1,1,Genetics & Heredity,NA,NA,"MARY ANN LIEBERT, INC",2017-05-18 +critica-revista hispanoamericana de filosofia,0011-1503,1870-4905,NA,1,0,0,0,NA,NA,Philosophy,CRITICA,NA +critica d arte,0011-1511,NA,NA,1,0,0,0,NA,NA,Art,CASA EDITRICE LE LETTERE,NA +critica letteraria,0390-0142,2035-2638,CLetteraria,1,0,0,1,NA,NA,"Literature, Romance",PAOLO LOFFREDO INIZIATIVE EDITORIALI SRL,2011-10-03 +critical arts-south-north cultural and media studies,0256-0046,1992-6049,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +critical arts-south-north cultural and media studies,0256-0046,1992-6049,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +critical asian studies,1467-2715,1472-6033,criticasianstds,0,1,0,1,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-01-20 +critical care,1364-8535,1466-609X,Crit_Care,0,0,1,1,Critical Care Medicine,NA,NA,BMC,2013-07-24 +critical care and resuscitation,1441-2772,2652-9335,CCRJournal,0,0,1,1,Critical Care Medicine,NA,NA,AUSTRALASIAN MED PUBL CO LTD,2018-09-07 +critical care clinics,0749-0704,1557-8232,CritCareClinics,0,0,1,1,Critical Care Medicine,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2012-06-13 +critical care medicine,0090-3493,1530-0293,CritCareMed,0,0,1,1,Critical Care Medicine,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-10 +critical care nurse,0279-5442,1940-8250,NA,0,1,1,0,Critical Care Medicine | Nursing,Nursing,NA,AMER ASSOC CRITICAL CARE NURSES,NA +critical care nurse,0279-5442,1940-8250,NA,0,1,1,0,Critical Care Medicine | Nursing,Nursing,NA,AMER ASSOC CRITICAL CARE NURSES,NA +critical care nursing clinics of north america,0899-5885,1558-3481,NA,0,1,1,0,Nursing,Nursing,NA,W B SAUNDERS CO-ELSEVIER INC,NA +critical care nursing clinics of north america,0899-5885,1558-3481,NA,0,1,1,0,Nursing,Nursing,NA,W B SAUNDERS CO-ELSEVIER INC,NA +critical criminology,1205-8629,1572-9877,NA,0,1,0,0,NA,Criminology & Penology,NA,SPRINGER,NA +critical discourse studies,1740-5904,1740-5912,critdiscstuds,0,1,0,1,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-11-15 +critical inquiry,0093-1896,1539-7858,CriticalInquiry,1,1,0,1,NA,Cultural Studies,Cultural Studies,UNIV CHICAGO PRESS,2011-10-15 +critical inquiry,0093-1896,1539-7858,CriticalInquiry,1,1,0,1,NA,Cultural Studies,Cultural Studies,UNIV CHICAGO PRESS,2011-10-15 +critical perspectives on accounting,1045-2354,1095-9955,NA,0,1,0,0,NA,"Business, Finance",NA,ELSEVIER,NA +critical policy studies,1946-0171,1946-018X,critical_policy,0,1,0,1,NA,Political Science | Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-03-02 +critical public health,0958-1596,1469-3682,CPHjournal,0,1,0,1,NA,"Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-06-13 +critical quarterly,0011-1562,1467-8705,CritQuarterly,1,0,0,1,NA,NA,Literary Reviews,WILEY,2018-11-22 +critical review,0891-3811,1933-8007,NA,0,1,0,0,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +critical reviews in analytical chemistry,1040-8347,1547-6510,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,TAYLOR & FRANCIS INC,NA +critical reviews in biochemistry and molecular biology,1040-9238,1549-7798,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +critical reviews in biotechnology,0738-8551,1549-7801,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,TAYLOR & FRANCIS LTD,NA +critical reviews in clinical laboratory sciences,1040-8363,1549-781X,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +critical reviews in environmental science and technology,1064-3389,1547-6537,NA,0,0,1,0,Environmental Sciences,NA,NA,TAYLOR & FRANCIS INC,NA +critical reviews in eukaryotic gene expression,1045-4403,2162-6502,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,BEGELL HOUSE INC,NA +critical reviews in food science and nutrition,1040-8398,1549-7852,NA,0,0,1,0,Food Science & Technology | Nutrition & Dietetics,NA,NA,TAYLOR & FRANCIS INC,NA +critical reviews in immunology,1040-8401,2162-6472,NA,0,0,1,0,Immunology,NA,NA,BEGELL HOUSE INC,NA +critical reviews in microbiology,1040-841X,1549-7828,NA,0,0,1,0,Microbiology,NA,NA,TAYLOR & FRANCIS LTD,NA +critical reviews in oncology hematology,1040-8428,1879-0461,CHematology,0,0,1,1,Oncology | Hematology,NA,NA,ELSEVIER SCIENCE INC,2019-06-21 +critical reviews in plant sciences,0735-2689,1549-7836,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS INC,NA +critical reviews in solid state and materials sciences,1040-8436,1547-6561,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS INC,NA +critical reviews in therapeutic drug carrier systems,0743-4863,2162-660X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,BEGELL HOUSE INC,NA +critical reviews in toxicology,1040-8444,1547-6898,NA,0,0,1,0,Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +critical social policy,0261-0183,1461-703X,criticalsocpol,0,1,0,1,NA,"Social Issues | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,2017-06-26 +critical sociology,0896-9205,1569-1632,critsoc,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS INC,2011-12-03 +critical studies in education,1750-8487,1750-8495,CritStudsEd,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-02-14 +critical studies in media communication,1529-5036,1479-5809,NA,0,1,0,0,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +critical studies in television,1749-6020,1749-6039,NA,1,0,0,0,NA,NA,"Film, Radio, Television",SAGE PUBLICATIONS LTD,NA +critical survey,0011-1570,1752-2293,CriticalSurvey,1,0,0,1,NA,NA,Literary Theory & Criticism,BERGHAHN JOURNALS,2016-03-17 +criticism-a quarterly for literature and the arts,0011-1589,1536-0342,CriticismJrnl,1,0,0,1,NA,NA,Literary Theory & Criticism | Literature,WAYNE STATE UNIV PRESS,2021-08-26 +criticon,0247-381X,2272-9852,NA,1,0,0,0,NA,NA,"Literature, Romance | Literary Theory & Criticism",PRESSES UNIV MIDI-PUM,NA +critique,0011-1600,1968-3901,NA,1,0,0,0,NA,NA,Literary Reviews,EDITIONS MINUIT,NA +critique-studies in contemporary fiction,0011-1619,1939-9138,NA,1,0,0,0,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +critique of anthropology,0308-275X,1460-3721,critanth,0,1,0,1,NA,Anthropology,NA,SAGE PUBLICATIONS LTD,2019-05-05 +croatian journal of education-hrvatski casopis za odgoj i obrazovanje,1848-5189,1848-5197,NA,0,1,0,0,NA,Education & Educational Research,NA,FAC TEACHER EDUCATION,NA +croatian journal of forest engineering,1845-5719,1845-5719,NA,0,0,1,0,Forestry,NA,NA,"ZAGREB UNIV, FAC FORESTRY",NA +croatian journal of philosophy,1333-1108,1847-6139,NA,1,0,0,0,NA,NA,Philosophy,KRUZAK D O O,NA +croatian medical journal,0353-9504,1332-8166,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MEDICINSKA NAKLADA,NA +croatica chemica acta,0011-1643,1334-417X,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CROATIAN CHEMICAL SOC,NA +crop & pasture science,1836-0947,1836-5795,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,CSIRO PUBLISHING,NA +crop breeding and applied biotechnology,1984-7033,1984-7033,NA,0,0,1,0,Agronomy | Biotechnology & Applied Microbiology,NA,NA,BRAZILIAN SOC PLANT BREEDING,NA +crop journal,2095-5421,2214-5141,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,KEAI PUBLISHING LTD,NA +crop protection,0261-2194,1873-6904,NA,0,0,1,0,Agronomy,NA,NA,ELSEVIER SCI LTD,NA +crop science,0011-183X,1435-0653,crop_science,0,0,1,1,Agronomy,NA,NA,WILEY,2015-01-22 +cross-cultural research,1069-3971,1552-3578,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +cross cultural & strategic management,2059-5794,2059-5794,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +crustaceana,0011-216X,1568-5403,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,BRILL,NA +cryobiology,0011-2240,1090-2392,NA,0,0,1,0,Biology | Physiology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +cryogenics,0011-2275,1879-2235,NA,0,0,1,0,"Thermodynamics | Physics, Applied",NA,NA,ELSEVIER SCI LTD,NA +cryoletters,0143-2044,1742-0644,NA,0,0,1,0,Biology | Physiology,NA,NA,CRYO LETTERS,NA +cryosphere,1994-0416,1994-0424,EGU_TC,0,0,1,1,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-15 +cryptogamie algologie,0181-1568,1776-0984,NA,0,0,1,0,Plant Sciences | Marine & Freshwater Biology,NA,NA,ADAC-CRYPTOGAMIE,NA +cryptogamie bryologie,1290-0796,1776-0992,NA,0,0,1,0,Plant Sciences,NA,NA,ADAC-CRYPTOGAMIE,NA +cryptogamie mycologie,0181-1584,1776-100X,NA,0,0,1,0,Mycology,NA,NA,ADAC-CRYPTOGAMIE,NA +cryptography and communications-discrete-structures boolean functions and sequences,1936-2447,1936-2455,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,SPRINGER,NA +cryptologia,0161-1194,1558-1586,NA,0,0,1,0,"Computer Science, Theory & Methods | History & Philosophy Of Science | Mathematics, Applied",NA,NA,TAYLOR & FRANCIS INC,NA +crystal growth & design,1528-7483,1528-7505,CGD_ACS,0,0,1,1,"Chemistry, Multidisciplinary | Crystallography | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2015-05-29 +crystal research and technology,0232-1300,1521-4079,NA,0,0,1,0,Crystallography,NA,NA,WILEY-V C H VERLAG GMBH,NA +crystallography reports,1063-7745,1562-689X,NA,0,0,1,0,Crystallography,NA,NA,PLEIADES PUBLISHING INC,NA +crystallography reviews,0889-311X,1476-3508,NA,0,0,1,0,Crystallography,NA,NA,TAYLOR & FRANCIS LTD,NA +crystals,2073-4352,2073-4352,Crystals_MDPI,0,0,1,1,"Crystallography | Materials Science, Multidisciplinary",NA,NA,MDPI,2016-03-28 +crystengcomm,1466-8033,1466-8033,CrystEngComm,0,0,1,1,"Chemistry, Multidisciplinary | Crystallography",NA,NA,ROYAL SOC CHEMISTRY,2009-02-13 +csee journal of power and energy systems,2096-0042,2096-0042,CSEEJPES,0,0,1,1,"Energy & Fuels | Engineering, Electrical & Electronic",NA,NA,CHINA ELECTRIC POWER RESEARCH INST,2021-07-05 +ct&f-ciencia tecnologia y futuro,0122-5383,2382-4581,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum",NA,NA,ECOPETROL SA,NA +cts-clinical and translational science,1752-8054,1752-8062,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,WILEY,NA +cuadernos de desarrollo rural,0122-1450,2215-7727,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,"PONTIFICIA UNIV JAVERIANA, FAC EDUC",NA +cuadernos hispanoamericanos,0011-250X,NA,Cuadernos_hisp,1,0,0,1,NA,NA,Literary Reviews,AGENCIA ESPANOLA COOPERACION INT DESARROLO-AECID,2017-12-20 +cuaj-canadian urological association journal,1911-6470,1920-1214,NA,0,0,1,0,Urology & Nephrology,NA,NA,CANADIAN UROLOGICAL ASSOCIATION,NA +cultura-international journal of philosophy of culture and axiology,1584-1057,2065-5002,NA,1,0,0,0,NA,NA,Philosophy,"PETER LANG GMBH, EUROPAISCHER VERLAG WISSENSCHAFTEN",NA +cultural & social history,1478-0038,1478-0046,CultSocHistory,1,0,0,1,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-12-11 +cultural anthropology,0886-7356,1548-1360,NA,0,1,0,0,NA,Anthropology,NA,SOC CULTURAL ANTHROPOLOGY,NA +cultural critique,0882-4371,1460-2458,CulturalCritiq1,1,1,0,1,NA,Cultural Studies,Cultural Studies,UNIV MINNESOTA PRESS,2019-10-21 +cultural critique,0882-4371,1460-2458,CulturalCritiq1,1,1,0,1,NA,Cultural Studies,Cultural Studies,UNIV MINNESOTA PRESS,2019-10-21 +cultural diversity & ethnic minority psychology,1099-9809,1939-0106,NA,0,1,0,0,NA,"Ethnic Studies | Psychology, Social",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +cultural geographies,1474-4740,1477-0881,culturalsage,0,1,0,1,NA,Environmental Studies | Geography,NA,SAGE PUBLICATIONS LTD,2020-03-27 +cultural sociology,1749-9755,1749-9763,culsoc,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2017-02-10 +cultural studies,0950-2386,1466-4348,NA,1,1,0,0,NA,Cultural Studies | Anthropology,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cultural studies,0950-2386,1466-4348,NA,1,1,0,0,NA,Cultural Studies | Anthropology,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +cultural studies-critical methodologies,1532-7086,1552-356X,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS INC,NA +cultural studies-critical methodologies,1532-7086,1552-356X,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS INC,NA +cultural studies of science education,1871-1502,1871-1510,cssejournal,1,1,0,1,NA,Cultural Studies | Education & Educational Research,Cultural Studies,SPRINGER,2021-02-17 +cultural studies of science education,1871-1502,1871-1510,cssejournal,1,1,0,1,NA,Cultural Studies | Education & Educational Research,Cultural Studies,SPRINGER,2021-02-17 +cultural studies review,1837-8692,1837-8692,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"UNIV TECHNOLOGY, SYDNEY-UTS EPRESS",NA +cultural studies review,1837-8692,1837-8692,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"UNIV TECHNOLOGY, SYDNEY-UTS EPRESS",NA +cultural trends,0954-8963,1469-3690,CulturalTrends_,1,1,0,1,NA,"Cultural Studies | Social Sciences, Interdisciplinary","Cultural Studies | Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-07-16 +cultural trends,0954-8963,1469-3690,CulturalTrends_,1,1,0,1,NA,"Cultural Studies | Social Sciences, Interdisciplinary","Cultural Studies | Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-07-16 +culture & history digital journal,2253-797X,2253-797X,NA,1,1,0,0,NA,History,History,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +culture & history digital journal,2253-797X,2253-797X,NA,1,1,0,0,NA,History,History,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +culture & psychology,1354-067X,1461-7056,Cultpsy,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS LTD,2012-11-30 +culture and organization,1475-9551,1477-2760,NA,0,1,0,0,NA,Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +culture education,1135-6405,1578-4118,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +culture et musees,1766-2923,2111-4528,cultureetmusees,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",ACTES SUD,2019-11-05 +culture health & sexuality,1369-1058,1464-5351,journal_chs,0,1,0,1,NA,"Family Studies | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-04-07 +culture medicine and psychiatry,0165-005X,1573-076X,CMPjournal,0,1,0,1,NA,"Anthropology | Psychiatry | Social Sciences, Biomedical",NA,SPRINGER,2013-11-04 +curator-the museum journal,0011-3069,2151-6952,CuratorJournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",WILEY,2009-09-05 +current addiction reports,2196-2952,2196-2952,NA,0,1,0,0,NA,Substance Abuse,NA,SPRINGERNATURE,NA +current allergy and asthma reports,1529-7322,1534-6315,NA,0,0,1,0,Allergy | Immunology,NA,NA,CURRENT MEDICINE GROUP,NA +current alzheimer research,1567-2050,1875-5828,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current analytical chemistry,1573-4110,1875-6727,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current anthropology,0011-3204,1537-5382,NA,0,1,0,0,NA,Anthropology,NA,UNIV CHICAGO PRESS,NA +current applied physics,1567-1739,1878-1675,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER,NA +current atherosclerosis reports,1523-3804,1534-6242,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,CURRENT MEDICINE GROUP,NA +current bioinformatics,1574-8936,2212-392X,NA,0,0,1,0,Biochemical Research Methods | Mathematical & Computational Biology,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current biology,0960-9822,1879-0445,CurrentBiology,0,0,1,1,Biochemistry & Molecular Biology | Biology | Cell Biology,NA,NA,CELL PRESS,2012-09-21 +current cancer drug targets,1568-0096,1873-5576,NA,0,0,1,0,Oncology,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current cardiology reports,1523-3782,1534-3170,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,SPRINGER,NA +current climate change reports,2198-6061,2198-6061,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,SPRINGER HEIDELBERG,NA +current computer-aided drug design,1573-4099,1875-6697,NA,0,0,1,0,"Chemistry, Medicinal | Computer Science, Interdisciplinary Applications",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current diabetes reports,1534-4827,1539-0829,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,CURRENT MEDICINE GROUP,NA +current directions in psychological science,0963-7214,1467-8721,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +current drug delivery,1567-2018,1875-5704,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current drug metabolism,1389-2002,1875-5453,NA,0,0,1,0,Biochemistry & Molecular Biology | Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current drug targets,1389-4501,1873-5592,Currentdrugtarg,0,0,1,1,Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,2016-07-28 +current environmental health reports,NA,2196-5412,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SPRINGERNATURE,NA +current environmental health reports,NA,2196-5412,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SPRINGERNATURE,NA +current epidemiology reports,2196-2995,2196-2995,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,SPRINGER HEIDELBERG,NA +current eye research,0271-3683,1460-2202,NA,0,0,1,0,Ophthalmology,NA,NA,TAYLOR & FRANCIS INC,NA +current forestry reports,2198-6436,2198-6436,NA,0,0,1,0,Forestry,NA,NA,SPRINGER INT PUBL AG,NA +current gene therapy,1566-5232,1875-5631,BenthamCgt,0,0,1,1,Genetics & Heredity,NA,NA,BENTHAM SCIENCE PUBL LTD,2016-07-28 +current genetics,0172-8083,1432-0983,NA,0,0,1,0,Genetics & Heredity,NA,NA,SPRINGER,NA +current genomics,1389-2029,1875-5488,CurrentGenomics,0,0,1,1,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,BENTHAM SCIENCE PUBL LTD,2016-07-28 +current hematologic malignancy reports,1558-8211,1558-822X,NA,0,0,1,0,Oncology | Hematology,NA,NA,CURRENT MEDICINE GROUP,NA +current herpetology,1345-5834,1881-1019,NA,0,0,1,0,Zoology,NA,NA,"HERPETOLOGICAL SOC JAPAN, KYOTO UNIV, GRADUATE SCH SCIE",NA +current history,0011-3530,1944-785X,currenthistory1,0,1,0,1,NA,International Relations | Political Science,NA,UNIV CALIFORNIA PRESS,2013-08-20 +current hiv research,1570-162X,1873-4251,CurrentHiv,0,0,1,1,Immunology | Infectious Diseases | Virology,NA,NA,BENTHAM SCIENCE PUBL LTD,2016-08-10 +current hiv/aids reports,1548-3568,1548-3576,NA,0,0,1,0,Infectious Diseases,NA,NA,SPRINGER,NA +current hypertension reports,1522-6417,1534-3111,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,SPRINGER,NA +current infectious disease reports,1523-3847,1534-3146,NA,0,0,1,0,Infectious Diseases,NA,NA,SPRINGER,NA +current issues in language planning,1466-4208,1747-7506,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +current issues in language planning,1466-4208,1747-7506,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +current issues in molecular biology,1467-3037,1467-3045,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,MDPI,NA +current issues in tourism,1368-3500,1747-7603,TourismIssues,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-10-08 +current legal problems,0070-1998,2044-8422,NA,0,1,0,0,NA,Law,NA,OXFORD UNIV PRESS,NA +current medical imaging,1573-4056,1875-6603,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current medical research and opinion,0300-7995,1473-4877,CMRO_Journal,0,0,1,1,"Medicine, General & Internal | Medicine, Research & Experimental",NA,NA,TAYLOR & FRANCIS LTD,2009-03-27 +current medical science,2096-5230,2523-899X,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,SPRINGER,NA +current medicinal chemistry,0929-8673,1875-533X,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current microbiology,0343-8651,1432-0991,NA,0,0,1,0,Microbiology,NA,NA,SPRINGER,NA +current molecular medicine,1566-5240,1875-5666,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current molecular pharmacology,1874-4672,1874-4702,NA,0,0,1,0,Biochemistry & Molecular Biology | Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current nanoscience,1573-4137,1875-6786,CurrentNanoscie,0,0,1,1,"Biotechnology & Applied Microbiology | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,BENTHAM SCIENCE PUBL LTD,2016-08-02 +current neurology and neuroscience reports,1528-4042,1534-6293,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,SPRINGER,NA +current neuropharmacology,1570-159X,1875-6190,NA,0,0,1,0,Neurosciences | Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current neurovascular research,1567-2026,1875-5739,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current nutrition reports,2161-3311,2161-3311,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,SPRINGERNATURE,NA +current obesity reports,2162-4968,2162-4968,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,SPRINGER,NA +current oncology,1198-0052,1718-7729,CurrentOncology,0,0,1,1,Oncology,NA,NA,MDPI,2013-04-11 +current oncology reports,1523-3790,1534-6269,NA,0,0,1,0,Oncology,NA,NA,SPRINGER,NA +current opinion in allergy and clinical immunology,1528-4050,1473-6322,NA,0,0,1,0,Allergy | Immunology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in anesthesiology,0952-7907,1473-6500,CO_Anesthesiol,0,0,1,1,Anesthesiology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-02 +current opinion in behavioral sciences,2352-1546,2352-1554,NA,0,1,1,0,Behavioral Sciences | Neurosciences,"Psychology, Experimental",NA,ELSEVIER,NA +current opinion in behavioral sciences,2352-1546,2352-1554,NA,0,1,1,0,Behavioral Sciences | Neurosciences,"Psychology, Experimental",NA,ELSEVIER,NA +current opinion in biomedical engineering,2468-4511,2468-4511,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,ELSEVIER,NA +current opinion in biotechnology,0958-1669,1879-0429,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology,NA,NA,CURRENT BIOLOGY LTD,NA +current opinion in cardiology,0268-4705,1531-7080,CO_Cardiology,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-02 +current opinion in cell biology,0955-0674,1879-0410,NA,0,0,1,0,Cell Biology,NA,NA,CURRENT BIOLOGY LTD,NA +current opinion in chemical biology,1367-5931,1879-0402,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER SCI LTD,NA +current opinion in chemical engineering,2211-3398,2211-3398,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +current opinion in clinical nutrition and metabolic care,1363-1950,1473-6519,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in colloid & interface science,1359-0294,1879-0399,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER SCIENCE LONDON,NA +current opinion in critical care,1070-5295,1531-7072,CO_CriticalCare,0,0,1,1,Critical Care Medicine,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-02 +current opinion in electrochemistry,2451-9103,2451-9103,NA,0,0,1,0,"Chemistry, Physical | Electrochemistry | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +current opinion in endocrinology diabetes and obesity,1752-296X,1752-2978,CO_EndoDiabetes,0,0,1,1,Endocrinology & Metabolism,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-02 +current opinion in environmental sustainability,1877-3435,1877-3443,NA,0,0,1,0,Green & Sustainable Science & Technology | Environmental Sciences,NA,NA,ELSEVIER SCI LTD,NA +current opinion in food science,2214-7993,2214-8000,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER SCI LTD,NA +current opinion in gastroenterology,0267-1379,1531-7056,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in genetics & development,0959-437X,1879-0380,NA,0,0,1,0,Cell Biology | Genetics & Heredity,NA,NA,CURRENT BIOLOGY LTD,NA +current opinion in green and sustainable chemistry,2452-2236,2452-2236,NA,0,0,1,0,"Chemistry, Multidisciplinary | Green & Sustainable Science & Technology",NA,NA,ELSEVIER,NA +current opinion in hematology,1065-6251,1531-7048,NA,0,0,1,0,Hematology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in hiv and aids,1746-630X,1746-6318,NA,0,0,1,0,Immunology | Infectious Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in immunology,0952-7915,1879-0372,NA,0,0,1,0,Immunology,NA,NA,CURRENT BIOLOGY LTD,NA +current opinion in infectious diseases,0951-7375,1473-6527,CO_Infectious_D,0,0,1,1,Infectious Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-05 +current opinion in insect science,2214-5745,2214-5753,NA,0,0,1,0,Biology | Ecology | Entomology,NA,NA,ELSEVIER,NA +current opinion in lipidology,0957-9672,1473-6535,CO_Lipidology,0,0,1,1,Biochemistry & Molecular Biology | Endocrinology & Metabolism | Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-05 +current opinion in microbiology,1369-5274,1879-0364,NA,0,0,1,0,Microbiology,NA,NA,CURRENT BIOLOGY LTD,NA +current opinion in nephrology and hypertension,1062-4821,1473-6543,NA,0,0,1,0,Urology & Nephrology | Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in neurobiology,0959-4388,1873-6882,NA,0,0,1,0,Neurosciences,NA,NA,CURRENT BIOLOGY LTD,NA +current opinion in neurology,1350-7540,1473-6551,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in obstetrics & gynecology,1040-872X,1473-656X,CO_Obs_Gyne,0,0,1,1,Obstetrics & Gynecology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-05 +current opinion in oncology,1040-8746,1531-703X,CO_Oncology,0,0,1,1,Oncology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-05 +current opinion in ophthalmology,1040-8738,1531-7021,NA,0,0,1,0,Ophthalmology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in organ transplantation,1087-2418,1531-7013,CO_Organ_Transp,0,0,1,1,Transplantation,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-05 +current opinion in otolaryngology & head and neck surgery,1068-9508,1531-6998,NA,0,0,1,0,Otorhinolaryngology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in pediatrics,1040-8703,1531-698X,CO_Pediatrics,0,0,1,1,Pediatrics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-05 +current opinion in pharmacology,1471-4892,1471-4973,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER SCI LTD,NA +current opinion in plant biology,1369-5266,1879-0356,NA,0,0,1,0,Plant Sciences,NA,NA,CURRENT BIOLOGY LTD,NA +current opinion in psychiatry,0951-7367,1473-6578,NA,0,1,1,0,Psychiatry,Psychiatry,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in psychiatry,0951-7367,1473-6578,NA,0,1,1,0,Psychiatry,Psychiatry,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in psychology,2352-250X,2352-2518,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,ELSEVIER,NA +current opinion in pulmonary medicine,1070-5287,1531-6971,CO_Pulmonary_Md,0,0,1,1,Respiratory System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-05 +current opinion in rheumatology,1040-8711,1531-6963,CO_Rheumatology,0,0,1,1,Rheumatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-09-05 +current opinion in solid state & materials science,1359-0286,1879-0348,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +current opinion in structural biology,0959-440X,1879-033X,COSB_CRSB,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,CURRENT BIOLOGY LTD,2019-05-04 +current opinion in supportive and palliative care,1751-4258,1751-4266,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in urology,0963-0643,1473-6586,NA,0,0,1,0,Urology & Nephrology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +current opinion in virology,1879-6257,1879-6265,NA,0,0,1,0,Virology,NA,NA,ELSEVIER SCI LTD,NA +current optics and photonics,2508-7266,2508-7274,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC KOREA,NA +current organic chemistry,1385-2728,1875-5348,NA,0,0,1,0,"Chemistry, Organic",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current organic synthesis,1570-1794,1875-6271,NA,0,0,1,0,"Chemistry, Organic",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current osteoporosis reports,1544-1873,1544-2241,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER,NA +current pain and headache reports,1531-3433,1534-3081,NA,0,0,1,0,Clinical Neurology,NA,NA,SPRINGER,NA +current perspectives in social theory,0278-1204,NA,NA,0,1,0,0,NA,Sociology,NA,EMERALD GROUP PUBLISHING LTD,NA +current pharmaceutical analysis,1573-4129,1875-676X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current pharmaceutical biotechnology,1389-2010,1873-4316,NA,0,0,1,0,Biochemistry & Molecular Biology | Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current pharmaceutical design,1381-6128,1873-4286,CpdCurrent,0,0,1,1,Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current pharmaceutical design,1381-6128,1873-4286,CpdCurrent,0,0,1,1,Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current pollution reports,2198-6592,2198-6592,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,SPRINGER HEIDELBERG,NA +current problems in cancer,0147-0272,1535-6345,NA,0,0,1,0,Oncology,NA,NA,MOSBY-ELSEVIER,NA +current problems in cardiology,0146-2806,1535-6280,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,MOSBY-ELSEVIER,NA +current problems in pediatric and adolescent health care,1538-5442,1538-3199,NA,0,0,1,0,Pediatrics,NA,NA,ELSEVIER SCIENCE INC,NA +current problems in surgery,0011-3840,1535-6337,NA,0,0,1,0,Surgery,NA,NA,MOSBY-ELSEVIER,NA +current protein & peptide science,1389-2037,1875-5550,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current proteomics,1570-1646,1875-6247,CurrentProteomi,0,0,1,1,Biochemical Research Methods | Biochemistry & Molecular Biology,NA,NA,BENTHAM SCIENCE PUBL LTD,2016-08-11 +current psychiatry reports,1523-3812,1535-1645,NA,0,1,1,0,Psychiatry,Psychiatry,NA,SPRINGER,NA +current psychiatry reports,1523-3812,1535-1645,NA,0,1,1,0,Psychiatry,Psychiatry,NA,SPRINGER,NA +current psychology,1046-1310,1936-4733,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SPRINGER,NA +current research in translational medicine,2452-3186,2452-3186,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +current rheumatology reports,1523-3774,1534-6307,NA,0,0,1,0,Rheumatology,NA,NA,SPRINGER,NA +current science,0011-3891,0011-3891,CurrSci,0,0,1,1,Multidisciplinary Sciences,NA,NA,INDIAN ACAD SCIENCES,2019-06-06 +current sociology,0011-3921,1461-7064,currentsociolog,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2015-06-15 +current sports medicine reports,1537-890X,1537-8918,CSMRonline,0,0,1,1,Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-29 +current stem cell research & therapy,1574-888X,2212-3946,NA,0,0,1,0,Cell & Tissue Engineering | Cell Biology,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current topics in developmental biology,0070-2153,1557-8933,NA,0,0,1,0,Developmental Biology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +current topics in medicinal chemistry,1568-0266,1873-5294,NA,0,0,1,0,"Chemistry, Medicinal",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current topics in membranes,1063-5823,NA,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +current topics in microbiology and immunology,0070-217X,2196-9965,NA,0,0,1,0,Immunology | Microbiology,NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +current topics in nutraceutical research,1540-7535,2641-452X,NA,0,0,1,0,Nutrition & Dietetics | Pharmacology & Pharmacy,NA,NA,"NEW CENTURY HEALTH PUBLISHERS, LLC",NA +current treatment options in neurology,1092-8480,1534-3138,NA,0,0,1,0,Clinical Neurology,NA,NA,CURRENT MEDICINE GROUP,NA +current treatment options in oncology,1527-2729,1534-6277,NA,0,0,1,0,Oncology,NA,NA,SPRINGER,NA +current urology reports,1527-2737,1534-6285,NA,0,0,1,0,Urology & Nephrology,NA,NA,SPRINGER,NA +current vascular pharmacology,1570-1611,1875-6212,NA,0,0,1,0,Pharmacology & Pharmacy | Peripheral Vascular Diseases,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +current zoology,1674-5507,2396-9814,NA,0,0,1,0,Zoology,NA,NA,OXFORD UNIV PRESS,NA +curriculum inquiry,0362-6784,1467-873X,CI_Editors,0,1,0,1,NA,Education & Educational Research,NA,TAYLOR & FRANCIS LTD,2015-04-16 +curriculum matters,1177-1828,NA,NA,0,1,0,0,NA,Education & Educational Research,NA,NEW ZEALAND COUNCIL EDUCATIONAL RESEARCH,NA +custos e agronegocio on line,1808-2882,1808-2882,NA,0,1,1,0,Agricultural Economics & Policy,Business | Economics,NA,"UNIV FED RURAL PERNAMBUCO, DEPT ADMINISTRACAO",NA +custos e agronegocio on line,1808-2882,1808-2882,NA,0,1,1,0,Agricultural Economics & Policy,Business | Economics,NA,"UNIV FED RURAL PERNAMBUCO, DEPT ADMINISTRACAO",NA +cutaneous and ocular toxicology,1556-9527,1556-9535,NA,0,0,1,0,Ophthalmology | Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +cutis,0011-4162,2326-6929,CutisJournal,0,0,1,1,Dermatology,NA,NA,QUADRANT HEALTHCOM INC,2011-03-23 +cybernetics and systems,0196-9722,1087-6553,NA,0,0,1,0,"Computer Science, Cybernetics",NA,NA,TAYLOR & FRANCIS INC,NA +cyberpsychology-journal of psychosocial research on cyberspace,1802-7962,1802-7962,Cyberpsych_Jn,0,1,0,1,NA,"Communication | Psychology, Multidisciplinary",NA,"MASARYKOVA UNIV, FAC SOCIAL STUDIES",2009-12-15 +cyberpsychology behavior and social networking,2152-2715,2152-2723,NA,0,1,0,0,NA,"Psychology, Social",NA,"MARY ANN LIEBERT, INC",NA +cybium,0399-0974,2101-0315,cybium,0,0,1,1,Zoology,NA,NA,SOC FRANCAISE D ICHTYOLOGIE,2018-10-12 +cyta-journal of food,1947-6337,1947-6345,NA,0,0,1,0,Food Science & Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +cytogenetic and genome research,1424-8581,1424-859X,NA,0,0,1,0,Cell Biology | Genetics & Heredity,NA,NA,KARGER,NA +cytojournal,0974-5963,1742-6413,NA,0,0,1,0,Pathology,NA,NA,SCIENTIFIC SCHOLAR LLC,NA +cytokine,1043-4666,1096-0023,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology | Immunology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +cytokine & growth factor reviews,1359-6101,1879-0305,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,ELSEVIER SCI LTD,NA +cytologia,0011-4545,0011-4545,NA,0,0,1,0,Cell Biology | Genetics & Heredity,NA,NA,UNIV TOKYO CYTOLOGIA,NA +cytology and genetics,0095-4527,1934-9440,NA,0,0,1,0,Genetics & Heredity,NA,NA,PLEIADES PUBLISHING INC,NA +cytometry part a,1552-4922,1552-4930,NA,0,0,1,0,Biochemical Research Methods | Cell Biology,NA,NA,WILEY,NA +cytometry part b-clinical cytometry,1552-4949,1552-4957,NA,0,0,1,0,Medical Laboratory Technology | Pathology,NA,NA,WILEY,NA +cytopathology,0956-5507,1365-2303,CytopathologyJ,0,0,1,1,Cell Biology | Pathology,NA,NA,WILEY,2013-07-29 +cytoskeleton,1949-3584,1949-3592,NA,0,0,1,0,Cell Biology,NA,NA,WILEY,NA +cytotechnology,0920-9069,1573-0778,NA,0,0,1,0,Biotechnology & Applied Microbiology | Cell Biology,NA,NA,SPRINGER,NA +cytotherapy,1465-3249,1477-2566,cytotherapy,0,0,1,1,"Cell & Tissue Engineering | Biotechnology & Applied Microbiology | Cell Biology | Hematology | Medicine, Research & Experimental",NA,NA,ELSEVIER SCI LTD,2020-09-03 +czech journal of animal science,1212-1819,1805-9309,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +czech journal of food sciences,1212-1800,1805-9317,NA,0,0,1,0,Food Science & Technology,NA,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +czech journal of genetics and plant breeding,1212-1975,1805-9325,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +czechoslovak mathematical journal,0011-4642,1572-9141,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +dados-revista de ciencias sociais,0011-5258,1678-4588,DadosRevista,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,INST UNIV PESQUISAS RIO DE JANEIRO-IUPERJ,2016-05-11 +daedalus,0011-5266,1548-6192,DaedalusJournal,1,1,0,1,NA,"Social Sciences, Interdisciplinary","Humanities, Multidisciplinary",MIT PRESS,NA +daedalus,0011-5266,1548-6192,DaedalusJournal,1,1,0,1,NA,"Social Sciences, Interdisciplinary","Humanities, Multidisciplinary",MIT PRESS,NA +dalhousie review,0011-5827,0011-5827,dalhousiereview,1,0,0,1,NA,NA,Literary Reviews,DALHOUSIE UNIV PRESS LTD,2013-09-04 +dalton transactions,1477-9226,1477-9234,DaltonTrans,0,0,1,1,"Chemistry, Inorganic & Nuclear",NA,NA,ROYAL SOC CHEMISTRY,2009-02-13 +dance chronicle,0147-2526,1532-4257,NA,1,0,0,0,NA,NA,Dance,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +dance magazine,0011-6009,NA,Dance_Magazine,1,0,0,1,NA,NA,Dance,DANCE MAGAZINE INC,2009-04-09 +dance research,0264-2875,1750-0095,NA,1,0,0,0,NA,NA,Dance,EDINBURGH UNIV PRESS,NA +dance research journal,0149-7677,1940-509X,NA,1,0,0,0,NA,NA,Dance,CAMBRIDGE UNIV PRESS,NA +dancing times,0011-605X,0011-605X,dancingtimes,1,0,0,1,NA,NA,Dance,DANCING TIMES LTD,2010-10-01 +danish medical journal,2245-1919,2245-1919,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,DANISH MEDICAL ASSOC,NA +dao-a journal of comparative philosophy,1540-3009,1569-7274,NA,1,0,0,0,NA,NA,Philosophy | Asian Studies,SPRINGER,NA +daphnis-zeitschrift fur mittlere deutsche literatur,0300-693X,1879-6583,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",EDITIONS RODOPI BV,NA +daru-journal of pharmaceutical sciences,2008-2231,2008-2231,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGER INT PUBL AG,NA +data & knowledge engineering,0169-023X,1872-6933,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,ELSEVIER,NA +data base for advances in information systems,0095-0033,1532-0936,NA,0,1,0,0,NA,Information Science & Library Science,NA,ASSOC COMPUTING MACHINERY,NA +data mining and knowledge discovery,1384-5810,1573-756X,DAMI_Social,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,SPRINGER,2020-11-13 +data technologies and applications,2514-9288,2514-9318,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +data technologies and applications,2514-9288,2514-9318,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +database-the journal of biological databases and curation,1758-0463,1758-0463,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,OXFORD UNIV PRESS,NA +dead sea discoveries,0929-0761,1568-5179,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +death studies,0748-1187,1091-7683,NA,0,1,0,0,NA,"Psychology, Multidisciplinary | Social Issues | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +decision analysis,1545-8490,1545-8504,NA,0,1,0,0,NA,Management,NA,INFORMS,NA +decision sciences,0011-7315,1540-5915,NA,0,1,0,0,NA,Management,NA,WILEY,NA +decision support systems,0167-9236,1873-5797,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Operations Research & Management Science",NA,NA,ELSEVIER,NA +deep-sea research part i-oceanographic research papers,0967-0637,1879-0119,NA,0,0,1,0,Oceanography,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +deep-sea research part ii-topical studies in oceanography,0967-0645,1879-0100,NA,0,0,1,0,Oceanography,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +defence and peace economics,1024-2694,1476-8267,NA,0,1,0,0,NA,Economics,NA,TAYLOR & FRANCIS LTD,NA +defence science journal,0011-748X,0976-464X,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,DEFENCE SCIENTIFIC INFORMATION DOCUMENTATION CENTRE,NA +defence technology,2214-9147,2214-9147,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,ELSEVIER,NA +degres-revue de synthese a orientation semiologique,0376-8163,NA,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",DEGRES,NA +deleuze and guattari studies,2398-9777,2398-9785,NA,1,0,0,0,NA,NA,Philosophy,EDINBURGH UNIV PRESS,NA +dementia-international journal of social research and practice,1471-3012,1741-2684,DementiaJournal,0,1,0,1,NA,Gerontology,NA,SAGE PUBLICATIONS LTD,2014-02-27 +dementia and geriatric cognitive disorders,1420-8008,1421-9824,NA,0,0,1,0,Geriatrics & Gerontology | Clinical Neurology | Psychiatry,NA,NA,KARGER,NA +democratization,1351-0347,1743-890X,democ_journal,0,1,0,1,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-01-29 +demographic research,1435-9871,1435-9871,DemographicRes,0,1,0,1,NA,Demography,NA,MAX PLANCK INST DEMOGRAPHIC RESEARCH,2012-07-27 +demography,0070-3370,1533-7790,ReadDemography,0,1,0,1,NA,Demography,NA,DUKE UNIV PRESS,2022-01-13 +demonstratio mathematica,0420-1213,2391-4661,NA,0,0,1,0,Mathematics,NA,NA,DE GRUYTER POLAND SP Z O O,NA +dendrobiology,1641-1307,2083-8387,dendrobiology,0,0,1,1,Forestry,NA,NA,BOGUCKI WYDAWNICTWO NAUKOWE,2021-01-09 +dendrochronologia,1125-7865,1612-0051,NA,0,0,1,0,"Forestry | Geography, Physical",NA,NA,ELSEVIER GMBH,NA +denkmalpflege,0947-031X,NA,Die_Denkmalpfl,1,0,0,1,NA,NA,Architecture,DEUTSCHER KUNSTVERLAG GMBH,2021-10-14 +dental materials,0109-5641,1879-0097,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Materials Science, Biomaterials",NA,NA,ELSEVIER SCI LTD,NA +dental materials journal,0287-4547,0287-4547,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Materials Science, Biomaterials",NA,NA,JAPANESE SOC DENTAL MATERIALS DEVICES,NA +dental traumatology,1600-4469,1600-9657,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +dentomaxillofacial radiology,0250-832X,1476-542X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,BRITISH INST RADIOLOGY,NA +denver law review,2469-6463,2469-6463,denverlawreview,0,1,0,1,NA,Law,NA,"UNIV DENVER, STURM COLLEGE LAW",2010-08-03 +depositional record,2055-4877,2055-4877,DepositRecord,0,0,1,1,Geology,NA,NA,WILEY,2019-08-13 +depression and anxiety,1091-4269,1520-6394,NA,0,1,1,0,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,WILEY,NA +depression and anxiety,1091-4269,1520-6394,NA,0,1,1,0,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,WILEY,NA +dermatitis,1710-3568,2162-5220,DermatitisJrnl,0,0,1,1,Dermatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2012-02-09 +dermatologic clinics,0733-8635,1558-0520,NA,0,0,1,0,Dermatology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +dermatologic surgery,1076-0512,1524-4725,DermSurg_ASDS,0,0,1,1,Dermatology | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2019-05-30 +dermatologic therapy,1396-0296,1529-8019,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +dermatologica sinica,1027-8117,2223-330X,NA,0,0,1,0,Dermatology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +dermatology,1018-8665,1421-9832,NA,0,0,1,0,Dermatology,NA,NA,KARGER,NA +dermatology and therapy,2193-8210,2190-9172,DermatolTher,0,0,1,1,Dermatology,NA,NA,ADIS INT LTD,2017-07-19 +dermatology practical & conceptual,2160-9381,2160-9381,NA,0,0,1,0,Dermatology,NA,NA,MATTIOLI 1885,NA +desalination,0011-9164,1873-4464,NA,0,0,1,0,"Engineering, Chemical | Water Resources",NA,NA,ELSEVIER,NA +desalination and water treatment,1944-3994,1944-3986,NA,0,0,1,0,"Engineering, Chemical | Water Resources",NA,NA,DESALINATION PUBL,NA +design and culture,1754-7075,1754-7083,DesignCultureJo,1,0,0,1,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-08-30 +design automation for embedded systems,0929-5585,1572-8080,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,SPRINGER,NA +design issues,0747-9360,1531-4790,NA,1,0,0,0,NA,NA,Architecture,MIT PRESS,NA +design journal,1460-6925,1756-3062,NA,1,0,0,0,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +design studies,0142-694X,1872-6909,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Manufacturing",NA,NA,ELSEVIER SCI LTD,NA +designed monomers and polymers,1385-772X,1568-5551,NA,0,0,1,0,Polymer Science,NA,NA,TAYLOR & FRANCIS LTD,NA +designs codes and cryptography,0925-1022,1573-7586,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,SPRINGER,NA +deutsche entomologische zeitschrift,1435-1951,1522-2403,NA,0,0,1,0,Entomology,NA,NA,PENSOFT PUBLISHERS,NA +deutsche lebensmittel-rundschau,0012-0413,0012-0413,NA,0,0,1,0,Food Science & Technology,NA,NA,B BEHES VERLAG GMBH & CO KG,NA +deutsche medizinische wochenschrift,0012-0472,1439-4413,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,GEORG THIEME VERLAG KG,NA +deutsche sprache,0340-9341,1866-5233,NA,1,0,0,0,NA,NA,Language & Linguistics,ERICH SCHMIDT VERLAG,NA +deutsche vierteljahrsschrift fur literaturwissenschaft und geistesgeschichte,0012-0936,2365-9521,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,J B METZLER,NA +deutsche zeitschrift fur philosophie,0012-1045,2192-1482,NA,1,0,0,0,NA,NA,Philosophy,WALTER DE GRUYTER GMBH,NA +deutsches arzteblatt international,1866-0452,1866-0452,Dt_Aerzteblatt,0,0,1,1,"Medicine, General & Internal",NA,NA,DEUTSCHER AERZTE-VERLAG GMBH,2009-06-29 +developing economies,0012-1533,1746-1049,NA,0,1,0,0,NA,Development Studies | Economics,NA,WILEY,NA +developing world bioethics,1471-8731,1471-8847,NA,0,1,1,0,Medical Ethics,Ethics,NA,WILEY,NA +developing world bioethics,1471-8731,1471-8847,NA,0,1,1,0,Medical Ethics,Ethics,NA,WILEY,NA +development,0950-1991,1477-9129,Dev_journal,0,0,1,1,Developmental Biology,NA,NA,COMPANY BIOLOGISTS LTD,2010-02-04 +development and change,0012-155X,1467-7660,DevandChg,0,1,0,1,NA,Development Studies,NA,WILEY,2019-09-03 +development and psychopathology,0954-5794,1469-2198,NA,0,1,0,0,NA,"Psychology, Development",NA,CAMBRIDGE UNIV PRESS,NA +development genes and evolution,0949-944X,1432-041X,NA,0,0,1,0,Cell Biology | Evolutionary Biology | Developmental Biology,NA,NA,SPRINGER,NA +development growth & differentiation,0012-1592,1440-169X,dgd_journal,0,0,1,1,Cell Biology | Developmental Biology,NA,NA,WILEY,2020-05-23 +development policy review,0950-6764,1467-7679,NA,0,1,0,0,NA,Development Studies,NA,WILEY,NA +development southern africa,0376-835X,1470-3637,NA,0,1,0,0,NA,Development Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +developmental and comparative immunology,0145-305X,1879-0089,NA,0,0,1,0,Fisheries | Immunology | Veterinary Sciences | Zoology,NA,NA,ELSEVIER SCI LTD,NA +developmental biology,0012-1606,1095-564X,Dev_Bio_Journal,0,0,1,1,Developmental Biology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2019-04-24 +developmental cell,1534-5807,1878-1551,Dev_Cell,0,0,1,1,Cell Biology | Developmental Biology,NA,NA,CELL PRESS,2013-12-09 +developmental cognitive neuroscience,1878-9293,1878-9307,NA,0,1,1,0,Neurosciences,"Psychology, Development",NA,ELSEVIER SCI LTD,NA +developmental cognitive neuroscience,1878-9293,1878-9307,NA,0,1,1,0,Neurosciences,"Psychology, Development",NA,ELSEVIER SCI LTD,NA +developmental dynamics,1058-8388,1097-0177,NA,0,0,1,0,Anatomy & Morphology | Developmental Biology,NA,NA,WILEY,NA +developmental medicine and child neurology,0012-1622,1469-8749,NA,0,0,1,0,Clinical Neurology | Pediatrics,NA,NA,WILEY,NA +developmental neurobiology,1932-8451,1932-846X,NA,0,0,1,0,Developmental Biology | Neurosciences,NA,NA,WILEY,NA +developmental neuropsychology,8756-5641,1532-6942,NA,0,1,1,0,Psychology,"Psychology, Development | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +developmental neuropsychology,8756-5641,1532-6942,NA,0,1,1,0,Psychology,"Psychology, Development | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +developmental neurorehabilitation,1751-8423,1751-8431,NA,0,0,1,0,Clinical Neurology | Pediatrics | Rehabilitation,NA,NA,TAYLOR & FRANCIS INC,NA +developmental neuroscience,0378-5866,1421-9859,NA,0,0,1,0,Developmental Biology | Neurosciences,NA,NA,KARGER,NA +developmental psychobiology,0012-1630,1098-2302,NA,0,0,1,0,Developmental Biology | Psychology,NA,NA,WILEY,NA +developmental psychology,0012-1649,1939-0599,NA,0,1,0,0,NA,"Psychology, Development",NA,AMER PSYCHOLOGICAL ASSOC,NA +developmental review,0273-2297,1090-2406,NA,0,1,0,0,NA,"Psychology, Development",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +developmental science,1363-755X,1467-7687,NA,0,1,0,0,NA,"Psychology, Development | Psychology, Experimental",NA,WILEY,NA +deviance et societe,0378-7931,0378-5807,NA,0,1,0,0,NA,Criminology & Penology | Sociology,NA,MEDECINE ET HYGIENE,NA +deviant behavior,0163-9625,1521-0456,NA,0,1,0,0,NA,"Criminology & Penology | Psychology, Social | Sociology",NA,TAYLOR & FRANCIS INC,NA +diabetes,0012-1797,1939-327X,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,AMER DIABETES ASSOC,NA +diabetes-metabolism research and reviews,1520-7552,1520-7560,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,WILEY,NA +diabetes & metabolism,1262-3636,1878-1780,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,MASSON EDITEUR,NA +diabetes & metabolism journal,2233-6079,2233-6087,DiabetesMetabo3,0,0,1,1,Endocrinology & Metabolism,NA,NA,KOREAN DIABETES ASSOC,2021-04-15 +diabetes & vascular disease research,1479-1641,1752-8984,NA,0,0,1,0,Endocrinology & Metabolism | Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS LTD,NA +diabetes care,0149-5992,1935-5548,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,AMER DIABETES ASSOC,NA +diabetes metabolic syndrome and obesity-targets and therapy,1178-7007,1178-7007,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,DOVE MEDICAL PRESS LTD,NA +diabetes obesity & metabolism,1462-8902,1463-1326,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,WILEY,NA +diabetes research and clinical practice,0168-8227,1872-8227,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ELSEVIER IRELAND LTD,NA +diabetes stoffwechsel und herz,1861-7603,1861-7603,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,VERLAG KIRCHHEIM,NA +diabetes technology & therapeutics,1520-9156,1557-8593,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,"MARY ANN LIEBERT, INC",NA +diabetes therapy,1869-6953,1869-6961,Diabetes_Ther,0,0,1,1,Endocrinology & Metabolism,NA,NA,SPRINGER HEIDELBERG,2017-09-28 +diabetic medicine,0742-3071,1464-5491,DiabeticMed,0,0,1,1,Endocrinology & Metabolism,NA,NA,WILEY,2017-08-04 +diabetologe,1860-9716,1860-9724,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER HEIDELBERG,NA +diabetologia,0012-186X,1432-0428,DiabetologiaJnl,0,0,1,1,Endocrinology & Metabolism,NA,NA,SPRINGER,2015-03-19 +diabetologie und stoffwechsel,1861-9002,1861-9010,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,GEORG THIEME VERLAG KG,NA +diabetology & metabolic syndrome,1758-5996,1758-5996,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,BMC,NA +diachronica,0176-4225,1569-9714,Diachronica2,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2020-05-25 +diachronica,0176-4225,1569-9714,Diachronica2,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2020-05-25 +diacritics-a review of contemporary criticism,0300-7162,1080-6539,https://twitter.com/read_diacritics,1,0,0,1,NA,NA,Literary Theory & Criticism,JOHNS HOPKINS UNIV PRESS,NA +diagnostic and interventional imaging,2211-5684,2211-5684,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",NA +diagnostic and interventional radiology,1305-3825,1305-3612,DiagnIntervRad,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,TURKISH SOC RADIOLOGY,2019-12-23 +diagnostic cytopathology,8755-1039,1097-0339,DiagnosticCyto,0,0,1,1,Medical Laboratory Technology | Pathology,NA,NA,WILEY,2017-02-15 +diagnostic microbiology and infectious disease,0732-8893,1879-0070,NA,0,0,1,0,Infectious Diseases | Microbiology,NA,NA,ELSEVIER SCIENCE INC,NA +diagnostic pathology,1746-1596,1746-1596,NA,0,0,1,0,Pathology,NA,NA,BMC,NA +diagnostica,0012-1924,2190-622X,NA,0,1,0,0,NA,"Psychology, Clinical",NA,HOGREFE VERLAG,NA +diagnostics,2075-4418,2075-4418,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MDPI,NA +dialectica,0012-2017,1746-8361,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +dialectologia et geolinguistica,0942-4040,1867-0903,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +dialectologia et geolinguistica,0942-4040,1867-0903,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +dialog-a journal of theology,0012-2033,1540-6385,NA,1,0,0,0,NA,NA,Religion,WILEY,NA +dialogue-canadian philosophical review,0012-2173,1759-0949,NA,1,0,0,0,NA,NA,Philosophy,CAMBRIDGE UNIV PRESS,NA +dialogues in human geography,2043-8206,2043-8214,dialogueshg,0,1,0,1,NA,Geography,NA,SAGE PUBLICATIONS LTD,2018-04-23 +diamond and related materials,0925-9635,1879-0062,NA,0,0,1,0,"Materials Science, Multidisciplinary | Materials Science, Coatings & Films | Physics, Applied | Physics, Condensed Matter",NA,NA,ELSEVIER SCIENCE SA,NA +diasporas-histoire et societes,1637-5823,2431-1472,NA,1,0,0,0,NA,NA,History,PRESSES UNIV MIDI-PUM,NA +diatom research,0269-249X,2159-8347,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +dickens quarterly,0742-5473,2169-5377,NA,1,0,0,0,NA,NA,"Literature, British Isles",JOHNS HOPKINS UNIV PRESS,NA +dickensian,0012-2440,0012-2440,NA,1,0,0,0,NA,NA,"Literature, British Isles",DICKENS FELLOWSHIP,NA +differences-a journal of feminist cultural studies,1040-7391,1527-1986,differences_DUP,1,1,0,1,NA,Cultural Studies | Women'S Studies,Cultural Studies,DUKE UNIV PRESS,2021-08-13 +differences-a journal of feminist cultural studies,1040-7391,1527-1986,differences_DUP,1,1,0,1,NA,Cultural Studies | Women'S Studies,Cultural Studies,DUKE UNIV PRESS,2021-08-13 +differential and integral equations,0893-4983,0893-4983,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,KHAYYAM PUBL CO INC,NA +differential equations,0012-2661,1608-3083,NA,0,0,1,0,Mathematics,NA,NA,PLEIADES PUBLISHING INC,NA +differential geometry and its applications,0926-2245,1872-6984,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ELSEVIER,NA +differentiation,0301-4681,1432-0436,Diff_Journal,0,0,1,1,Cell Biology | Developmental Biology,NA,NA,ELSEVIER SCI LTD,2021-12-02 +digest journal of nanomaterials and biostructures,1842-3582,1842-3582,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,VIRTUAL CO PHYSICS SRL,NA +digestion,0012-2823,1421-9867,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,KARGER,NA +digestive and liver disease,1590-8658,1878-3562,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,ELSEVIER SCIENCE INC,NA +digestive diseases,0257-2753,1421-9875,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,KARGER,NA +digestive diseases and sciences,0163-2116,1573-2568,DDS_Journal,0,0,1,1,Gastroenterology & Hepatology,NA,NA,SPRINGER,2018-01-04 +digestive endoscopy,0915-5635,1443-1661,NA,0,0,1,0,Gastroenterology & Hepatology | Surgery,NA,NA,WILEY,NA +digestive surgery,0253-4886,1421-9883,NA,0,0,1,0,Gastroenterology & Hepatology | Surgery,NA,NA,KARGER,NA +digital communications and networks,2468-5925,2352-8648,NA,0,0,1,0,Telecommunications,NA,NA,KEAI PUBLISHING LTD,NA +digital creativity,1462-6268,1744-3806,NA,1,0,0,0,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +digital health,2055-2076,2055-2076,DigitalHealthJ,0,1,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Medical Informatics","Public, Environmental & Occupational Health | Health Policy & Services",NA,SAGE PUBLICATIONS LTD,2014-12-12 +digital health,2055-2076,2055-2076,DigitalHealthJ,0,1,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Medical Informatics","Public, Environmental & Occupational Health | Health Policy & Services",NA,SAGE PUBLICATIONS LTD,2014-12-12 +digital journalism,2167-0811,2167-082X,djeditorialteam,0,1,0,1,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-04-04 +digital scholarship in the humanities,2055-7671,2055-768X,DSHjournal,1,1,0,1,NA,Linguistics,"Humanities, Multidisciplinary",OXFORD UNIV PRESS,2011-02-20 +digital scholarship in the humanities,2055-7671,2055-768X,DSHjournal,1,1,0,1,NA,Linguistics,"Humanities, Multidisciplinary",OXFORD UNIV PRESS,2011-02-20 +digital signal processing,1051-2004,1095-4333,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +diplomacy & statecraft,0959-2296,1557-301X,dandsjournal,0,1,0,1,NA,History | International Relations,NA,TAYLOR & FRANCIS INC,2013-10-11 +diplomatic history,0145-2096,1467-7709,shafrdh,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2013-06-06 +diplomatic history,0145-2096,1467-7709,shafrdh,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2013-06-06 +disability & society,0968-7599,1360-0508,JDisSoc,0,1,0,1,NA,"Rehabilitation | Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-12-05 +disability and health journal,1936-6574,1876-7583,Dis_Health,0,1,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Rehabilitation","Public, Environmental & Occupational Health | Rehabilitation | Health Policy & Services",NA,ELSEVIER SCIENCE INC,2020-07-08 +disability and health journal,1936-6574,1876-7583,Dis_Health,0,1,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Rehabilitation","Public, Environmental & Occupational Health | Rehabilitation | Health Policy & Services",NA,ELSEVIER SCIENCE INC,2020-07-08 +disability and rehabilitation,0963-8288,1464-5165,DisabilityRehab,0,1,1,1,Rehabilitation,Rehabilitation,NA,TAYLOR & FRANCIS LTD,2020-06-11 +disability and rehabilitation,0963-8288,1464-5165,DisabilityRehab,0,1,1,1,Rehabilitation,Rehabilitation,NA,TAYLOR & FRANCIS LTD,2020-06-11 +disability and rehabilitation-assistive technology,1748-3107,1748-3115,DR_AssistTech,0,1,0,1,NA,Rehabilitation,NA,TAYLOR & FRANCIS INC,2020-06-12 +disaster medicine and public health preparedness,1935-7893,1938-744X,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,CAMBRIDGE UNIV PRESS,NA +disaster medicine and public health preparedness,1935-7893,1938-744X,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,CAMBRIDGE UNIV PRESS,NA +disaster prevention and management,0965-3562,1758-6100,DisasterPrevenM,0,1,0,1,NA,"Environmental Studies | Public, Environmental & Occupational Health | Management",NA,EMERALD GROUP PUBLISHING LTD,2022-01-27 +disasters,0361-3666,1467-7717,NA,0,1,0,0,NA,"Environmental Studies | Social Sciences, Interdisciplinary",NA,WILEY,NA +discourse-studies in the cultural politics of education,0159-6306,1469-3739,DiscourseofEd,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-02-18 +discourse & communication,1750-4813,1750-4821,NA,0,1,0,0,NA,Communication,NA,SAGE PUBLICATIONS INC,NA +discourse & society,0957-9265,1460-3624,NA,0,1,0,0,NA,"Communication | Psychology, Multidisciplinary | Sociology",NA,SAGE PUBLICATIONS LTD,NA +discourse context & media,2211-6958,2211-6966,NA,0,1,0,0,NA,Communication,NA,ELSEVIER SCI LTD,NA +discourse processes,0163-853X,1532-6950,DProcesses,0,1,0,1,NA,"Psychology, Educational | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-02-09 +discourse studies,1461-4456,1461-7080,NA,0,1,0,0,NA,Communication,NA,SAGE PUBLICATIONS LTD,NA +discover oncology,1868-8497,2730-6011,NA,0,0,1,0,Oncology | Endocrinology & Metabolism,NA,NA,SPRINGER,NA +discovery medicine,1539-6509,1944-7930,DiscovMed,0,0,1,1,"Medicine, Research & Experimental",NA,NA,DISCOVERY MEDICINE,2012-05-08 +discrete & computational geometry,0179-5376,1432-0444,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics",NA,NA,SPRINGER,NA +discrete analysis,NA,2397-3129,da_maths,0,0,1,1,Mathematics,NA,NA,ALLIANCE DIAMOND OPEN ACCESS JOURNALS,2016-03-30 +discrete and continuous dynamical systems,1078-0947,1553-5231,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +discrete and continuous dynamical systems-series b,1531-3492,1553-524X,NA,0,0,1,0,"Mathematics, Applied",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +discrete and continuous dynamical systems-series s,1937-1632,1937-1179,NA,0,0,1,0,"Mathematics, Applied",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +discrete applied mathematics,0166-218X,1872-6771,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ELSEVIER,NA +discrete dynamics in nature and society,1026-0226,1607-887X,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Multidisciplinary Sciences",NA,NA,HINDAWI LTD,NA +discrete event dynamic systems-theory and applications,0924-6703,1573-7594,NA,0,0,1,0,"Automation & Control Systems | Operations Research & Management Science | Mathematics, Applied",NA,NA,SPRINGER,NA +discrete mathematics,0012-365X,1872-681X,NA,0,0,1,0,Mathematics,NA,NA,ELSEVIER,NA +discrete mathematics and theoretical computer science,1462-7264,1365-8050,NA,0,0,1,0,"Computer Science, Software Engineering | Mathematics, Applied | Mathematics",NA,NA,DISCRETE MATHEMATICS THEORETICAL COMPUTER SCIENCE,NA +discrete optimization,1572-5286,1873-636X,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,ELSEVIER,NA +discussiones mathematicae graph theory,1234-3099,2083-5892,NA,0,0,1,0,Mathematics,NA,NA,SCIENDO,NA +disease markers,0278-0240,1875-8630,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Genetics & Heredity | Medicine, Research & Experimental | Pathology",NA,NA,HINDAWI LTD,NA +disease models & mechanisms,1754-8403,1754-8411,DMM_Journal,0,0,1,1,Cell Biology | Pathology,NA,NA,COMPANY BIOLOGISTS LTD,2009-09-24 +diseases of aquatic organisms,0177-5103,1616-1580,NA,0,0,1,0,Fisheries | Veterinary Sciences,NA,NA,INTER-RESEARCH,NA +diseases of the colon & rectum,0012-3706,1530-0358,DCRjournal,0,0,1,1,Gastroenterology & Hepatology | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-07 +diseases of the esophagus,1120-8694,1442-2050,DOTEsophagus,0,0,1,1,Gastroenterology & Hepatology,NA,NA,OXFORD UNIV PRESS INC,2021-09-09 +disegnare idee immagini-ideas images,1123-9247,1123-9247,NA,1,0,0,0,NA,NA,Architecture,GANGEMI EDITORE SPA,NA +disp,0251-3625,2166-8604,NA,0,1,0,0,NA,Regional & Urban Planning,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +disparidades-revista de antropologia,NA,2659-6881,Disparidades_,1,0,0,1,NA,NA,Folklore,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,2018-11-27 +displays,0141-9382,1872-7387,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic | Instruments & Instrumentation | Optics",NA,NA,ELSEVIER,NA +dissent,0012-3846,1946-0910,dissentmag,0,1,0,1,NA,Political Science | Social Issues,NA,"FOUNDATION STUDY INDEPENDENT SOCIAL IDEAS, INC",2009-03-05 +dissertationes mathematicae,0012-3862,1730-6310,NA,0,0,1,0,Mathematics,NA,NA,POLISH ACAD SCIENCES INST MATHEMATICS-IMPAN,NA +dissolution technologies,1521-298X,2376-869X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,"DISSOLUTION TECHNOLOGIES, INC",NA +distance education,0158-7919,1475-0198,DistEdJournal,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-06-18 +distributed and parallel databases,0926-8782,1573-7578,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +distributed computing,0178-2770,1432-0452,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +diversity-basel,1424-2818,1424-2818,DiversityMdpi,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,MDPI,2016-08-16 +diversity and distributions,1366-9516,1472-4642,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,WILEY,NA +diving and hyperbaric medicine,1833-3516,1833-3516,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,SOUTH PACIFIC UNDERWATER MED SOC,NA +dix-neuf,1478-7318,1478-7318,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +dix-septieme siecle,0012-4273,1969-6965,NA,1,0,0,0,NA,NA,"History | Literature, Romance",SOC ETUD 17 SIECLE,NA +dm disease-a-month,0011-5029,1557-8194,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MOSBY-ELSEVIER,NA +dna and cell biology,1044-5498,1557-7430,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology | Genetics & Heredity,NA,NA,"MARY ANN LIEBERT, INC",NA +dna repair,1568-7864,1568-7856,repair_dna,0,0,1,1,Genetics & Heredity | Toxicology,NA,NA,ELSEVIER,2019-04-20 +dna research,1340-2838,1756-1663,NA,0,0,1,0,Genetics & Heredity,NA,NA,OXFORD UNIV PRESS,NA +documenta mathematica,1431-0643,1431-0643,NA,0,0,1,0,Mathematics,NA,NA,FIZ KARLSRUHE-LEIBNIZ-INST INFORMATIONSINFRASTRUKTUR,NA +documenta ophthalmologica,0012-4486,1573-2622,NA,0,0,1,0,Ophthalmology,NA,NA,SPRINGER,NA +doklady biochemistry and biophysics,1607-6729,1608-3091,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +doklady chemistry,0012-5008,1608-3113,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +doklady earth sciences,1028-334X,1531-8354,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +doklady mathematics,1064-5624,1531-8362,NA,0,0,1,0,Mathematics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +doklady physical chemistry,0012-5016,1608-3121,NA,0,0,1,0,"Chemistry, Physical",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +doklady physics,1028-3358,1562-6903,NA,0,0,1,0,"Mechanics | Physics, Multidisciplinary",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +domestic animal endocrinology,0739-7240,1879-0054,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Endocrinology & Metabolism",NA,NA,ELSEVIER SCIENCE INC,NA +dose-response,1559-3258,1559-3258,NA,0,0,1,0,"Pharmacology & Pharmacy | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SAGE PUBLICATIONS INC,NA +down beat,0012-5768,0012-5768,DownBeatMag,1,0,0,1,NA,NA,Music,MAHER PUBL INC,2011-06-09 +dreaming,1053-0797,1573-3351,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +dress-the journal of the costume society of america,0361-2112,2042-1729,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +drewno,1644-3985,1644-3985,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,INST TECHNOL DREWNA,NA +drones,2504-446X,2504-446X,Drones_MDPI,0,0,1,1,Remote Sensing,NA,NA,MDPI,2018-01-23 +drug and alcohol dependence,0376-8716,1879-0046,DrugAlcoholDep,0,1,1,1,Substance Abuse | Psychiatry,Substance Abuse | Psychiatry,NA,ELSEVIER IRELAND LTD,2018-10-11 +drug and alcohol dependence,0376-8716,1879-0046,DrugAlcoholDep,0,1,1,1,Substance Abuse | Psychiatry,Substance Abuse | Psychiatry,NA,ELSEVIER IRELAND LTD,2018-10-11 +drug and alcohol review,0959-5236,1465-3362,APSAD_DAR,0,1,0,1,NA,Substance Abuse,NA,WILEY,2011-09-08 +drug and chemical toxicology,0148-0545,1525-6014,NA,0,0,1,0,"Chemistry, Multidisciplinary | Pharmacology & Pharmacy | Toxicology",NA,NA,TAYLOR & FRANCIS LTD,NA +drug delivery,1071-7544,1521-0464,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +drug delivery and translational research,2190-393X,2190-3948,DDTReMedia,0,0,1,1,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,SPRINGER HEIDELBERG,2019-09-24 +drug delivery and translational research,2190-393X,2190-3948,DDTReMedia,0,0,1,1,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,SPRINGER HEIDELBERG,2019-09-24 +drug design development and therapy,1177-8881,1177-8881,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,DOVE MEDICAL PRESS LTD,NA +drug development and industrial pharmacy,0363-9045,1520-5762,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,TAYLOR & FRANCIS LTD,NA +drug development research,0272-4391,1098-2299,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,WILEY,NA +drug discovery today,1359-6446,1878-5832,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER SCI LTD,NA +drug metabolism and disposition,0090-9556,1521-009X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,AMER SOC PHARMACOLOGY EXPERIMENTAL THERAPEUTICS,NA +drug metabolism and pharmacokinetics,1347-4367,1880-0920,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,JAPANESE SOC STUDY XENOBIOTICS,NA +drug metabolism reviews,0360-2532,1097-9883,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +drug resistance updates,1368-7646,1532-2084,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,CHURCHILL LIVINGSTONE,NA +drug safety,0114-5916,1179-1942,DrugSafetyJ,0,0,1,1,"Public, Environmental & Occupational Health | Pharmacology & Pharmacy | Toxicology",NA,NA,ADIS INT LTD,2010-03-17 +drug safety,0114-5916,1179-1942,DrugSafetyJ,0,0,1,1,"Public, Environmental & Occupational Health | Pharmacology & Pharmacy | Toxicology",NA,NA,ADIS INT LTD,2010-03-17 +drug testing and analysis,1942-7603,1942-7611,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical | Pharmacology & Pharmacy",NA,NA,WILEY,NA +drugs,0012-6667,1179-1950,DrugsJournal,0,0,1,1,Pharmacology & Pharmacy | Toxicology,NA,NA,ADIS INT LTD,2010-03-08 +drugs-education prevention and policy,0968-7637,1465-3370,NA,0,1,0,0,NA,Substance Abuse,NA,TAYLOR & FRANCIS LTD,NA +drugs & aging,1170-229X,1179-1969,NA,0,0,1,0,Geriatrics & Gerontology | Pharmacology & Pharmacy,NA,NA,ADIS INT LTD,NA +drugs in r&d,1174-5886,1179-6901,DrugsInRD,0,0,1,1,Pharmacology & Pharmacy,NA,NA,SPRINGER INT PUBL AG,2010-06-10 +drugs of the future,0377-8282,2013-0368,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,"PROUS SCIENCE, SAU-THOMSON REUTERS",NA +drugs of today,1699-3993,1699-4019,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,"PROUS SCIENCE, SAU-THOMSON REUTERS",NA +drustvena istrazivanja,1330-0288,1330-0288,DI_JGSI,0,1,0,1,NA,Social Issues | Sociology,NA,INST OF SOCIAL SCIENCES IVO PILAR,2016-05-11 +drvna industrija,0012-6772,1847-1153,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,"ZAGREB UNIV, FAC FORESTRY",NA +drying technology,0737-3937,1532-2300,NA,0,0,1,0,"Engineering, Chemical | Engineering, Mechanical",NA,NA,TAYLOR & FRANCIS INC,NA +du,0012-6837,0012-6837,NA,1,0,0,0,NA,NA,Art,DU VERLAG,NA +du bois review-social science research on race,1742-058X,1742-0598,DuBoisReview,0,1,0,1,NA,Ethnic Studies | Sociology,NA,CAMBRIDGE UNIV PRESS,2010-05-27 +duke law journal,0012-7086,1939-9111,dukelawjournal,0,1,0,1,NA,Law,NA,DUKE UNIV,2009-02-19 +duke mathematical journal,0012-7094,1547-7398,NA,0,0,1,0,Mathematics,NA,NA,DUKE UNIV PRESS,NA +dutch crossing-journal of low countries studies,0309-6564,1759-7854,NA,1,1,0,0,NA,History,"History | Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +dutch crossing-journal of low countries studies,0309-6564,1759-7854,NA,1,1,0,0,NA,History,"History | Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +dyes and pigments,0143-7208,1873-3743,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical | Materials Science, Textiles",NA,NA,ELSEVIER SCI LTD,NA +dyna,0012-7361,1989-1490,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,FEDERACION ASOCIACIONES INGENIEROS INDUSTRIALES ESPANA,NA +dynamic games and applications,2153-0785,2153-0793,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER BIRKHAUSER,NA +dynamical systems-an international journal,1468-9367,1468-9375,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,TAYLOR & FRANCIS LTD,NA +dynamics of atmospheres and oceans,0377-0265,1872-6879,NA,0,0,1,0,Geochemistry & Geophysics | Meteorology & Atmospheric Sciences | Oceanography,NA,NA,ELSEVIER,NA +dynamics of partial differential equations,1548-159X,1548-159X,NA,0,0,1,0,"Mathematics, Applied",NA,NA,"INT PRESS BOSTON, INC",NA +dynamis,0211-9536,2340-7948,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,EDITORIAL UNIV GRANADA,NA +dynamis,0211-9536,2340-7948,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,EDITORIAL UNIV GRANADA,NA +dynamis,0211-9536,2340-7948,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,EDITORIAL UNIV GRANADA,NA +dyslexia,1076-9242,1099-0909,NA,0,1,0,0,NA,"Education, Special | Psychology, Educational | Rehabilitation",NA,WILEY,NA +dysphagia,0179-051X,1432-0460,NA,0,0,1,0,Otorhinolaryngology,NA,NA,SPRINGER,NA +e-polymers,1618-7229,1618-7229,ePoly_DG,0,0,1,1,Polymer Science,NA,NA,WALTER DE GRUYTER GMBH,2021-04-20 +e & m ekonomie a management,1212-3609,2336-5064,NA,0,1,0,0,NA,Economics | Management,NA,TECHNICAL UNIV LIBEREC,NA +ear and hearing,0196-0202,1538-4667,EandHonline,0,0,1,1,Audiology & Speech-Language Pathology | Otorhinolaryngology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-28 +early american literature,0012-8163,1534-147X,Early_Am_Lit,1,0,0,1,NA,NA,"Literature, American",UNIV NORTH CAROLINA PRESS,2013-11-24 +early child development and care,0300-4430,1476-8275,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +early childhood education journal,1082-3301,1573-1707,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +early childhood research quarterly,0885-2006,1873-7706,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Development",NA,ELSEVIER SCIENCE INC,NA +early china,0362-5028,2325-2324,NA,1,0,0,0,NA,NA,Asian Studies,CAMBRIDGE UNIV PRESS,NA +early education and development,1040-9289,1556-6935,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational | Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +early human development,0378-3782,1872-6232,NA,0,0,1,0,Obstetrics & Gynecology | Pediatrics,NA,NA,ELSEVIER IRELAND LTD,NA +early intervention in psychiatry,1751-7885,1751-7893,NA,0,1,1,0,Psychiatry,Psychiatry,NA,WILEY,NA +early intervention in psychiatry,1751-7885,1751-7893,NA,0,1,1,0,Psychiatry,Psychiatry,NA,WILEY,NA +early medieval china,1529-9104,1946-7842,medieval_china,1,0,0,1,NA,NA,Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-05-03 +early medieval europe,0963-9462,1468-0254,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,WILEY,NA +early modern french studies,2056-3035,2056-3043,NA,1,0,0,0,NA,NA,"History | Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +early modern women-an interdisciplinary journal,1933-0065,1933-0065,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV CHICAGO PRESS,NA +early music,0306-1078,1741-7260,EarlyMus,1,0,0,1,NA,NA,Music,OXFORD UNIV PRESS,2014-05-20 +early music history,0261-1279,1474-0559,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +early popular visual culture,1746-0654,1746-0662,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +early science and medicine,1383-7427,1573-3823,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,BRILL,NA +early science and medicine,1383-7427,1573-3823,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,BRILL,NA +early years,0957-5146,1472-4421,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +earth-science reviews,0012-8252,1872-6828,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +earth and environmental science transactions of the royal society of edinburgh,1755-6910,1755-6929,NA,0,0,1,0,"Geosciences, Multidisciplinary | Paleontology",NA,NA,CAMBRIDGE UNIV PRESS,NA +earth and planetary science letters,0012-821X,1385-013X,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,ELSEVIER,NA +earth and space science,2333-5084,2333-5084,NA,0,0,1,0,"Astronomy & Astrophysics | Geosciences, Multidisciplinary",NA,NA,AMER GEOPHYSICAL UNION,NA +earth interactions,1087-3562,1087-3562,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,AMER GEOPHYSICAL UNION,NA +earth moon and planets,0167-9295,1573-0794,NA,0,0,1,0,"Astronomy & Astrophysics | Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +earth planets and space,1880-5981,1880-5981,eps_tweet,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,SPRINGER,2017-01-04 +earth science informatics,1865-0473,1865-0481,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Geosciences, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +earth sciences history,0736-623X,1944-6187,ESciHist,0,1,1,1,"Geosciences, Multidisciplinary | History & Philosophy Of Science",History & Philosophy Of Science,NA,HISTORY EARTH SCIENCES SOC,2012-02-02 +earth sciences history,0736-623X,1944-6187,ESciHist,0,1,1,1,"Geosciences, Multidisciplinary | History & Philosophy Of Science",History & Philosophy Of Science,NA,HISTORY EARTH SCIENCES SOC,2012-02-02 +earth sciences research journal,1794-6190,2339-3459,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,UNIV NACIONAL DE COLOMBIA,NA +earth surface dynamics,2196-6311,2196-632X,EGU_ESurf,0,0,1,1,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,COPERNICUS GESELLSCHAFT MBH,2013-03-15 +earth surface processes and landforms,0197-9337,1096-9837,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,WILEY,NA +earth system dynamics,2190-4979,2190-4987,EGU_ESD,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,COPERNICUS GESELLSCHAFT MBH,2013-10-10 +earth system science data,1866-3508,1866-3516,ESSD_journal,0,0,1,1,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-21 +earthquake engineering & structural dynamics,0098-8847,1096-9845,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological",NA,NA,WILEY,NA +earthquake engineering and engineering vibration,1671-3664,1993-503X,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological",NA,NA,SPRINGER,NA +earthquake spectra,8755-2930,1944-8201,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological",NA,NA,SAGE PUBLICATIONS INC,NA +earthquakes and structures,2092-7614,2092-7622,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological",NA,NA,TECHNO-PRESS,NA +earths future,2328-4277,2328-4277,EarthsFutureEiC,0,0,1,1,"Environmental Sciences | Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,AMER GEOPHYSICAL UNION,2013-10-24 +east asian journal on applied mathematics,2079-7362,2079-7370,NA,0,0,1,0,"Mathematics, Applied",NA,NA,GLOBAL SCIENCE PRESS,NA +east asian science technology and society-an international journal,1875-2160,1875-2152,NA,1,1,0,0,NA,History & Philosophy Of Science | Area Studies,History & Philosophy Of Science | Asian Studies,TAYLOR & FRANCIS INC,NA +east asian science technology and society-an international journal,1875-2160,1875-2152,NA,1,1,0,0,NA,History & Philosophy Of Science | Area Studies,History & Philosophy Of Science | Asian Studies,TAYLOR & FRANCIS INC,NA +east european jewish affairs,1350-1674,1743-971X,E_E_J_A,1,0,0,1,NA,NA,History | Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-07-11 +east european politics and societies,0888-3254,1533-8371,eepsjournal,0,1,0,1,NA,Area Studies | Political Science,NA,SAGE PUBLICATIONS INC,2012-11-08 +eastern buddhist,0012-8708,NA,NA,1,0,0,0,NA,NA,Religion | Asian Studies,EASTERN BUDDHIST SOC,NA +eastern european countryside,1232-8855,1232-8855,NA,0,1,0,0,NA,Sociology,NA,SCIENDO,NA +eastern european economics,0012-8775,1557-9298,EasternEuropeEc,0,1,0,1,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-02 +eastern mediterranean health journal,1020-3397,1687-1634,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health",Health Policy & Services,NA,WHO EASTERN MEDITERRANEAN REGIONAL OFFICE,NA +eastern mediterranean health journal,1020-3397,1687-1634,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health",Health Policy & Services,NA,WHO EASTERN MEDITERRANEAN REGIONAL OFFICE,NA +eating and weight disorders-studies on anorexia bulimia and obesity,1124-4909,1590-1262,NA,0,0,1,0,Psychiatry,NA,NA,SPRINGER,NA +eating behaviors,1471-0153,1873-7358,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,ELSEVIER,NA +eating disorders,1064-0266,1532-530X,EDsJTP,0,1,1,1,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-02-06 +eating disorders,1064-0266,1532-530X,EDsJTP,0,1,1,1,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-02-06 +ebiomedicine,2352-3964,2352-3964,eBioMedicine,0,0,1,1,"Medicine, Research & Experimental",NA,NA,ELSEVIER,2014-06-06 +ecclesiastical law journal,0956-618X,1751-8539,NA,1,0,0,0,NA,NA,Religion,CAMBRIDGE UNIV PRESS,NA +echocardiography-a journal of cardiovascular ultrasound and allied techniques,0742-2822,1540-8175,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,WILEY,NA +eclinicalmedicine,2589-5370,2589-5370,eClinicalMed,0,0,1,1,"Medicine, General & Internal",NA,NA,ELSEVIER,2018-05-28 +eco mont-journal on protected mountain areas research,2073-106X,2073-1558,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,"AUSTRIAN ACAD SCIENCES PRESS, UNIV INNSBRUCK",NA +ecography,0906-7590,1600-0587,EcographyJourna,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,WILEY,2012-03-13 +ecohealth,1612-9202,1612-9210,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +ecohydrology,1936-0584,1936-0592,EcohydrologyEds,0,0,1,1,Ecology | Environmental Sciences | Water Resources,NA,NA,WILEY,2021-02-02 +ecohydrology & hydrobiology,1642-3593,2080-3397,NA,0,0,1,0,Ecology | Water Resources,NA,NA,EUROPEAN REGIONAL CENTRE ECOHYDROLOGY POLISH ACAD SCIENCES,NA +ecological applications,1051-0761,1939-5582,ESAApplications,0,0,1,1,Ecology | Environmental Sciences,NA,NA,WILEY,2017-03-07 +ecological chemistry and engineering s-chemia i inzynieria ekologiczna s,1898-6196,1898-6196,NA,0,0,1,0,Environmental Sciences,NA,NA,SCIENDO,NA +ecological complexity,1476-945X,1476-9840,NA,0,0,1,0,Ecology,NA,NA,ELSEVIER,NA +ecological economics,0921-8009,1873-6106,NA,0,1,1,0,Ecology | Environmental Sciences,Economics | Environmental Studies,NA,ELSEVIER,NA +ecological economics,0921-8009,1873-6106,NA,0,1,1,0,Ecology | Environmental Sciences,Economics | Environmental Studies,NA,ELSEVIER,NA +ecological engineering,0925-8574,1872-6992,NA,0,0,1,0,"Ecology | Engineering, Environmental | Environmental Sciences",NA,NA,ELSEVIER,NA +ecological entomology,0307-6946,1365-2311,Ecol_Ent,0,0,1,1,Entomology,NA,NA,WILEY,2015-04-29 +ecological indicators,1470-160X,1872-7034,NA,0,0,1,0,Environmental Sciences,NA,NA,ELSEVIER,NA +ecological informatics,1574-9541,1878-0512,ECOLINFORM,0,0,1,1,Ecology,NA,NA,ELSEVIER,2019-05-22 +ecological management & restoration,1442-7001,1442-8903,EMRjournal,0,0,1,1,Ecology,NA,NA,WILEY,2018-02-01 +ecological modelling,0304-3800,1872-7026,NA,0,0,1,0,Ecology,NA,NA,ELSEVIER,NA +ecological monographs,0012-9615,1557-7015,ESAMonographs,0,0,1,1,Ecology,NA,NA,WILEY,2013-09-06 +ecological processes,2192-1709,2192-1709,NA,0,0,1,0,Ecology | Environmental Sciences,NA,NA,SPRINGER,NA +ecological psychology,1040-7413,1532-6969,NA,0,1,0,0,NA,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +ecological research,0912-3814,1440-1703,EcologicalRes,0,0,1,1,Ecology,NA,NA,WILEY,2019-05-20 +ecological restoration,1543-4060,1543-4079,NA,0,0,1,0,Ecology,NA,NA,UNIV WISCONSIN PRESS,NA +ecology,0012-9658,1939-9170,NA,0,0,1,0,Ecology,NA,NA,WILEY,NA +ecology and evolution,2045-7758,2045-7758,Ecol_Evol,0,0,1,1,Ecology | Evolutionary Biology,NA,NA,WILEY,2018-09-06 +ecology and society,1708-3087,1708-3087,EcologySociety1,0,1,1,1,Ecology,Environmental Studies,NA,RESILIENCE ALLIANCE,2020-01-22 +ecology and society,1708-3087,1708-3087,EcologySociety1,0,1,1,1,Ecology,Environmental Studies,NA,RESILIENCE ALLIANCE,2020-01-22 +ecology law quarterly,0046-1121,0046-1121,elq_berkeley,0,1,0,1,NA,Environmental Studies | Law,NA,"UNIV CALIFORNIA, BERKELEY SCH LAW",2018-02-28 +ecology letters,1461-023X,1461-0248,Ecology_Letters,0,0,1,1,Ecology,NA,NA,WILEY,2016-07-18 +ecology of food and nutrition,0367-0244,1543-5237,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,TAYLOR & FRANCIS INC,NA +ecology of freshwater fish,0906-6691,1600-0633,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,WILEY,NA +econ journal watch,1933-527X,1933-527X,EconJWatch,0,1,0,1,NA,Economics,NA,INST SPONTANEOUS ORDER ECONOMICS,2011-03-02 +econometric reviews,0747-4938,1532-4168,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,TAYLOR & FRANCIS INC,NA +econometric reviews,0747-4938,1532-4168,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,TAYLOR & FRANCIS INC,NA +econometric theory,0266-4666,1469-4360,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,CAMBRIDGE UNIV PRESS,NA +econometric theory,0266-4666,1469-4360,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,CAMBRIDGE UNIV PRESS,NA +econometrica,0012-9682,1468-0262,ecmaEditors,0,1,1,1,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,WILEY,2020-07-03 +econometrica,0012-9682,1468-0262,ecmaEditors,0,1,1,1,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,WILEY,2020-07-03 +econometrics journal,1368-4221,1368-423X,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,OXFORD UNIV PRESS,NA +econometrics journal,1368-4221,1368-423X,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,OXFORD UNIV PRESS,NA +economia politica,1120-2890,1973-820X,NA,0,1,0,0,NA,Economics,NA,SPRINGER INT PUBL AG,NA +economic analysis and policy,0313-5926,0313-5926,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +economic and industrial democracy,0143-831X,1461-7099,NA,0,1,0,0,NA,Industrial Relations & Labor,NA,SAGE PUBLICATIONS LTD,NA +economic and labour relations review,1035-3046,1838-2673,TheELRR,0,1,0,1,NA,Economics | Industrial Relations & Labor,NA,SAGE PUBLICATIONS LTD,2017-07-12 +economic and social review,0012-9984,0012-9984,esr_ie,0,1,0,1,NA,Economics | Sociology,NA,ECONOMIC & SOCIAL STUDIES,2017-05-10 +economic anthropology,2330-4847,2330-4847,EconomicAnthro,0,1,0,1,NA,Anthropology,NA,WILEY,2020-08-31 +economic botany,0013-0001,1874-9364,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +economic change and restructuring,1573-9414,1574-0277,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +economic computation and economic cybernetics studies and research,0424-267X,1842-3264,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications",Economics,NA,ACAD ECONOMIC STUDIES,NA +economic computation and economic cybernetics studies and research,0424-267X,1842-3264,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications",Economics,NA,ACAD ECONOMIC STUDIES,NA +economic development and cultural change,0013-0079,1539-2988,NA,0,1,0,0,NA,Area Studies | Development Studies | Economics,NA,UNIV CHICAGO PRESS,NA +economic development quarterly,0891-2424,1552-3543,NA,0,1,0,0,NA,Development Studies | Economics | Urban Studies,NA,SAGE PUBLICATIONS INC,NA +economic geography,0013-0095,1944-8287,econgeog,0,1,0,1,NA,Economics | Geography,NA,TAYLOR & FRANCIS LTD,2016-09-06 +economic geology,0361-0128,1554-0774,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,"SOC ECONOMIC GEOLOGISTS, INC",NA +economic history review,0013-0117,1468-0289,echistsocreview,1,1,0,1,NA,History | Economics | History Of Social Sciences,History,WILEY,2019-04-09 +economic history review,0013-0117,1468-0289,echistsocreview,1,1,0,1,NA,History | Economics | History Of Social Sciences,History,WILEY,2019-04-09 +economic inquiry,0095-2583,1465-7295,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +economic journal,0013-0133,1468-0297,EJ_RES,0,1,0,1,NA,Economics,NA,OXFORD UNIV PRESS,2012-11-22 +economic modelling,0264-9993,1873-6122,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +economic policy,0266-4658,1468-0327,NA,0,1,0,0,NA,Economics,NA,OXFORD UNIV PRESS,NA +economic record,0013-0249,1475-4932,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +economic research-ekonomska istrazivanja,1331-677X,1848-9664,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +economic systems,0939-3625,1878-5433,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +economic systems research,0953-5314,1469-5758,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +economic theory,0938-2259,1432-0479,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +economica,0013-0427,1468-0335,EconomicaLSE,0,1,0,1,NA,Economics,NA,WILEY,2016-06-07 +economics-the open access open-assessment e-journal,1864-6042,1864-6042,ej_economics,0,1,0,1,NA,Economics,NA,WALTER DE GRUYTER GMBH,2009-08-13 +economics & human biology,1570-677X,1873-6130,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Economics",NA,ELSEVIER,NA +economics & human biology,1570-677X,1873-6130,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Economics",NA,ELSEVIER,NA +economics & politics,0954-1985,1468-0343,NA,0,1,0,0,NA,Economics | Political Science,NA,"WILEY PERIODICALS, INC",NA +economics and philosophy,0266-2671,1474-0028,NA,0,1,0,0,NA,Economics | Ethics,NA,CAMBRIDGE UNIV PRESS,NA +economics letters,0165-1765,1873-7374,NA,0,1,0,0,NA,Economics,NA,ELSEVIER SCIENCE SA,NA +economics of education review,0272-7757,1873-7382,NA,0,1,0,0,NA,Economics | Education & Educational Research,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +economics of energy & environmental policy,2160-5882,2160-5890,NA,0,1,0,0,NA,Economics | Environmental Studies,NA,INT ASSOC ENERGY ECONOMICS,NA +economics of governance,1435-6104,1435-8131,NA,0,1,0,0,NA,Economics,NA,SPRINGER HEIDELBERG,NA +economics of innovation and new technology,1043-8599,1476-8364,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +economics of transition,0967-0750,1468-0351,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +economics of transition and institutional change,2577-6975,2577-6983,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +economics of transportation,2212-0122,2212-0130,NA,0,1,0,0,NA,Economics | Transportation,NA,ELSEVIER,NA +economist-netherlands,0013-063X,1572-9982,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +economy and society,0308-5147,1469-5766,econsocjournal,0,1,0,1,NA,Economics | Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-01-13 +econtent,1525-2531,1525-2531,NA,0,1,0,0,NA,Information Science & Library Science,NA,ONLINE INC,NA +ecoscience,1195-6860,2376-7626,NA,0,0,1,0,Ecology,NA,NA,TAYLOR & FRANCIS INC,NA +ecosphere,2150-8925,2150-8925,ESAEcosphere,0,0,1,1,Ecology,NA,NA,WILEY,2016-12-06 +ecosystem health and sustainability,2096-4129,2332-8878,EHS__journal,0,0,1,1,Ecology | Environmental Sciences,NA,NA,TAYLOR & FRANCIS INC,2020-07-01 +ecosystem services,2212-0416,2212-0416,NA,0,1,1,0,Ecology | Environmental Sciences,Environmental Studies,NA,ELSEVIER,NA +ecosystem services,2212-0416,2212-0416,NA,0,1,1,0,Ecology | Environmental Sciences,Environmental Studies,NA,ELSEVIER,NA +ecosystems,1432-9840,1435-0629,EcosystemsJ,0,0,1,1,Ecology,NA,NA,SPRINGER,2014-10-28 +ecotoxicology,0963-9292,1573-3017,NA,0,0,1,0,Ecology | Environmental Sciences | Toxicology,NA,NA,SPRINGER,NA +ecotoxicology and environmental safety,0147-6513,1090-2414,NA,0,0,1,0,Environmental Sciences | Toxicology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +ecs journal of solid state science and technology,2162-8769,2162-8777,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELECTROCHEMICAL SOC INC,NA +ecumenical review,0013-0796,1758-6623,wccEREV,1,0,0,1,NA,NA,Religion,WILEY,2017-04-19 +educacion xx1,1139-613X,2174-5374,EducacionXX1,0,1,0,1,NA,Education & Educational Research,NA,UNIV NACIONAL EDUCACION DISTANCIA,2013-12-24 +education and information technologies,1360-2357,1573-7608,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +education and training,0040-0912,1758-6127,NA,0,1,0,0,NA,Education & Educational Research,NA,EMERALD GROUP PUBLISHING LTD,NA +education and training in autism and developmental disabilities,2154-1647,NA,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,COUNCIL EXCEPTIONAL CHILDREN,NA +education and treatment of children,0748-8491,1934-8924,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SPRINGERNATURE,NA +education and urban society,0013-1245,1552-3535,NA,0,1,0,0,NA,Education & Educational Research | Urban Studies,NA,SAGE PUBLICATIONS INC,NA +education as change,1682-3206,1947-9417,NA,0,1,0,0,NA,Education & Educational Research,NA,UNISA PRESS,NA +education finance and policy,1557-3060,1557-3079,EFPJournal,0,1,0,1,NA,Economics | Education & Educational Research,NA,MIT PRESS,2019-07-30 +education for chemical engineers,1749-7728,1749-7728,ECEJournal,0,0,1,1,"Education, Scientific Disciplines | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,2021-07-29 +educational administration quarterly,0013-161X,1552-3519,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +educational and psychological measurement,0013-1644,1552-3888,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Psychology, Educational | Psychology, Mathematical",NA,SAGE PUBLICATIONS INC,NA +educational and psychological measurement,0013-1644,1552-3888,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Psychology, Educational | Psychology, Mathematical",NA,SAGE PUBLICATIONS INC,NA +educational assessment evaluation and accountability,1874-8597,1874-8600,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER HEIDELBERG,NA +educational evaluation and policy analysis,0162-3737,1935-1062,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +educational gerontology,0360-1277,1521-0472,NA,0,1,0,0,NA,Education & Educational Research | Gerontology,NA,TAYLOR & FRANCIS INC,NA +educational leadership,0013-1784,1943-5878,NA,0,1,0,0,NA,Education & Educational Research,NA,ASSOC SUPERVISION CURRICULUM DEVELOPMENT,NA +educational management administration & leadership,1741-1432,1741-1440,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS LTD,NA +educational measurement-issues and practice,0731-1745,1745-3992,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,WILEY,NA +educational philosophy and theory,0013-1857,1469-5812,NA,0,1,0,0,NA,Education & Educational Research,NA,TAYLOR & FRANCIS LTD,NA +educational policy,0895-9048,1552-3896,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +educational psychologist,0046-1520,1532-6985,EdPsychJournal,0,1,0,1,NA,"Education & Educational Research | Psychology, Educational",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-01-02 +educational psychology,0144-3410,1469-5820,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +educational psychology review,1040-726X,1573-336X,NA,0,1,0,0,NA,"Psychology, Educational",NA,SPRINGER/PLENUM PUBLISHERS,NA +educational research,0013-1881,1469-5847,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +educational research review,1747-938X,1878-0385,NA,0,1,0,0,NA,Education & Educational Research,NA,ELSEVIER SCI LTD,NA +educational researcher,0013-189X,1935-102X,ERjournal_AERA,0,1,0,1,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,2019-09-27 +educational review,0013-1911,1465-3397,EdReview,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2010-09-23 +educational studies,0305-5698,1465-3400,EdStudiesAESA,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-01-06 +educational studies in mathematics,0013-1954,1573-0816,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +educational technology & society,1176-3647,1436-4522,NA,0,1,0,0,NA,Education & Educational Research,NA,INT FORUM EDUCATIONAL TECHNOLOGY & SOC-IFETS,NA +efort open reviews,2396-7544,2058-5241,NA,0,0,1,0,Orthopedics,NA,NA,BRITISH EDITORIAL SOC BONE & JOINT SURGERY,NA +efsa journal,1831-4732,1831-4732,EFSAJournal,0,0,1,1,Food Science & Technology,NA,NA,EUROPEAN FOOD SAFETY AUTHORITY-EFSA,2013-06-03 +ega-revista de expresion grafica arquitectonica,1133-6137,2254-6103,NA,1,0,0,0,NA,NA,Architecture,"UNIV POLITECNICA VALENCIA, EDITORIAL UPV",NA +egitim ve bilim-education and science,1300-1337,1300-1337,NA,0,1,0,0,NA,Education & Educational Research,NA,TURKISH EDUCATION ASSOC,NA +egyptian informatics journal,1110-8665,2090-4754,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,"CAIRO UNIV, FAC COMPUTERS & INFORMATION",NA +egyptian journal of biological pest control,1110-1768,2536-9342,NA,0,0,1,0,Entomology,NA,NA,SPRINGER,NA +egyptian journal of remote sensing and space sciences,1110-9823,2090-2476,NA,0,0,1,0,Environmental Sciences | Remote Sensing,NA,NA,ELSEVIER,NA +eighteenth-century fiction,0840-6286,1911-0243,ECFjournal,1,0,0,1,NA,NA,Literature,UNIV TORONTO PRESS INC,2012-01-30 +eighteenth-century life,0098-2601,1086-3192,NA,1,0,0,0,NA,NA,Literature,DUKE UNIV PRESS,NA +eighteenth-century music,1478-5706,1478-5714,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +eighteenth-century studies,0013-2586,1086-315X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,NA +eighteenth century-theory and interpretation,0193-5380,1935-0201,18CTANDI,1,0,0,1,NA,NA,Literary Theory & Criticism,UNIV PENNSYLVANIA PRESS,2018-09-24 +eigse-a journal of irish studies,0013-2608,0013-2608,NA,1,0,0,0,NA,NA,Language & Linguistics,"NATL UNIV IRELAND",NA +eikasmos-quaderni bolognesi di filologia classica,1121-8819,1121-8819,NA,1,0,0,0,NA,NA,Classics,PATRON EDITORE S R L,NA +eire-ireland,0013-2683,1550-5162,eire_ire,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",IRISH AMER CULTURAL INST,2017-09-18 +eirene-studia graeca et latina,0046-1628,NA,NA,1,0,0,0,NA,NA,Classics,INST CLASSICAL STUD ACAD SCI CZECH REPUBLIC,NA +ejnmmi physics,2197-7364,2197-7364,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +ejnmmi research,2191-219X,2191-219X,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +ejso,0748-7983,1532-2157,ejsotweets,0,0,1,1,Oncology | Surgery,NA,NA,ELSEVIER SCI LTD,2019-04-15 +ekonomicky casopis,0013-3035,0013-3035,NA,0,1,0,0,NA,Economics,NA,INST ECONOMICS RESEARCH SAS & INST FORECASTING CSPS SAS,NA +eksploatacja i niezawodnosc-maintenance and reliability,1507-2711,1507-2711,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,POLISH MAINTENANCE SOC,NA +electoral studies,0261-3794,1873-6890,electoralstdies,0,1,0,1,NA,Political Science,NA,ELSEVIER SCI LTD,2017-12-07 +electric power components and systems,1532-5008,1532-5016,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,TAYLOR & FRANCIS INC,NA +electric power systems research,0378-7796,1873-2046,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,ELSEVIER SCIENCE SA,NA +electrical engineering,0948-7921,1432-0487,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +electrical engineering in japan,0424-7760,1520-6416,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +electroanalysis,1040-0397,1521-4109,ElecAnalys,0,0,1,1,"Chemistry, Analytical | Electrochemistry",NA,NA,WILEY-V C H VERLAG GMBH,2020-09-18 +electrocatalysis,1868-2529,1868-5994,NA,0,0,1,0,"Chemistry, Physical | Electrochemistry",NA,NA,SPRINGER,NA +electrochemical energy reviews,2520-8489,2520-8136,NA,0,0,1,0,Electrochemistry,NA,NA,SPRINGERNATURE,NA +electrochemistry,1344-3542,2186-2451,NA,0,0,1,0,Electrochemistry,NA,NA,ELECTROCHEMICAL SOC JAPAN,NA +electrochemistry communications,1388-2481,1873-1902,NA,0,0,1,0,Electrochemistry,NA,NA,ELSEVIER SCIENCE INC,NA +electrochimica acta,0013-4686,1873-3859,NA,0,0,1,0,Electrochemistry,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +electromagnetic biology and medicine,1536-8378,1536-8386,NA,0,0,1,0,Biology | Biophysics,NA,NA,TAYLOR & FRANCIS INC,NA +electromagnetics,0272-6343,1532-527X,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,TAYLOR & FRANCIS INC,NA +electronic commerce research,1389-5753,1572-9362,NA,0,1,0,0,NA,Business | Management,NA,SPRINGER,NA +electronic commerce research and applications,1567-4223,1873-7846,NA,0,1,1,0,"Computer Science, Information Systems | Computer Science, Interdisciplinary Applications",Business,NA,ELSEVIER,NA +electronic commerce research and applications,1567-4223,1873-7846,NA,0,1,1,0,"Computer Science, Information Systems | Computer Science, Interdisciplinary Applications",Business,NA,ELSEVIER,NA +electronic communications in probability,1083-589X,1083-589X,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +electronic journal of biotechnology,0717-3458,0717-3458,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,UNIV CATOLICA DE VALPARAISO,NA +electronic journal of combinatorics,1077-8926,1077-8926,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ELECTRONIC JOURNAL OF COMBINATORICS,NA +electronic journal of differential equations,1072-6691,1072-6691,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,TEXAS STATE UNIV,NA +electronic journal of linear algebra,1537-9582,1081-3810,NA,0,0,1,0,Mathematics,NA,NA,INT LINEAR ALGEBRA SOC,NA +electronic journal of probability,1083-6489,1083-6489,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +electronic journal of qualitative theory of differential equations,1417-3875,1417-3875,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,"UNIV SZEGED, BOLYAI INSTITUTE",NA +electronic journal of statistics,1935-7524,1935-7524,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +electronic library,0264-0473,1758-616X,NA,0,1,0,0,NA,Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +electronic markets,1019-6781,1422-8890,Journal_EM,0,1,0,1,NA,Business | Management,NA,SPRINGER HEIDELBERG,2010-06-24 +electronic materials letters,1738-8090,2093-6788,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,KOREAN INST METALS MATERIALS,NA +electronic research archive,NA,2688-1594,NA,0,0,1,0,Mathematics,NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +electronic transactions on numerical analysis,1068-9613,1068-9613,NA,0,0,1,0,"Mathematics, Applied",NA,NA,KENT STATE UNIVERSITY,NA +electronics,2079-9292,2079-9292,ElectronicsMDPI,0,0,1,1,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Physics, Applied",NA,NA,MDPI,2012-10-10 +electronics and communications in japan,1942-9533,1942-9541,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +electronics letters,0013-5194,1350-911X,ElecLett,0,0,1,1,"Engineering, Electrical & Electronic",NA,NA,WILEY,2010-10-11 +electrophoresis,0173-0835,1522-2683,Electro28700254,0,0,1,1,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,WILEY,2021-05-25 +elektronika ir elektrotechnika,1392-1215,2029-5731,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,KAUNAS UNIV TECHNOLOGY,NA +elementa-science of the anthropocene,2325-1026,2325-1026,elementascience,0,0,1,1,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,UNIV CALIFORNIA PRESS,2012-10-23 +elementary school journal,0013-5984,1554-8279,NA,0,1,0,0,NA,Education & Educational Research,NA,UNIV CHICAGO PRESS,NA +elements,1811-5209,1811-5217,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,MINERALOGICAL SOC AMER,NA +elh,0013-8304,1080-6547,EnglishLitHist,1,0,0,1,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,2017-01-30 +elife,2050-084X,2050-084X,eLife,0,0,1,1,Biology,NA,NA,ELIFE SCIENCES PUBL LTD,2011-09-27 +elt journal,0951-0893,1477-4526,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,OXFORD UNIV PRESS,NA +elt journal,0951-0893,1477-4526,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,OXFORD UNIV PRESS,NA +emagres,2055-6101,2055-6101,NA,0,0,1,0,Spectroscopy,NA,NA,WILEY,NA +embo journal,0261-4189,1460-2075,embojournal,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,WILEY,2013-12-04 +embo molecular medicine,1757-4676,1757-4684,EmboMolMed,0,0,1,1,"Medicine, Research & Experimental",NA,NA,WILEY,2013-12-06 +embo reports,1469-221X,1469-3178,emboreports,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,WILEY,2013-12-06 +emergencias,1137-6821,2386-5857,EMERGENCIAS_NET,0,0,1,1,Emergency Medicine,NA,NA,SANIDAD EDICIONES,2011-11-23 +emergency medicine australasia,1742-6731,1742-6723,EMAJournal,0,0,1,1,Emergency Medicine,NA,NA,WILEY,2012-09-23 +emergency medicine clinics of north america,0733-8627,1558-0539,NA,0,0,1,0,Emergency Medicine,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +emergency medicine international,2090-2840,2090-2859,NA,0,0,1,0,Emergency Medicine,NA,NA,HINDAWI LTD,NA +emergency medicine journal,1472-0205,1472-0213,EmergencyMedBMJ,0,0,1,1,Emergency Medicine,NA,NA,BMJ PUBLISHING GROUP,2010-05-06 +emerging adulthood,2167-6968,2167-6984,EmergAdulthd,0,1,0,1,NA,"Family Studies | Psychology, Development | Psychology, Social",NA,SAGE PUBLICATIONS INC,2020-07-28 +emerging infectious diseases,1080-6040,1080-6059,CDC_EIDjournal,0,0,1,1,Immunology | Infectious Diseases,NA,NA,CENTERS DISEASE CONTROL & PREVENTION,NA +emerging markets finance and trade,1540-496X,1558-0938,NA,0,1,0,0,NA,Business | Economics | International Relations,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +emerging markets review,1566-0141,1873-6173,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +emerging materials research,2046-0147,2046-0155,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ICE PUBLISHING,NA +emerging microbes & infections,2222-1751,2222-1751,NA,0,0,1,0,Immunology | Infectious Diseases | Microbiology,NA,NA,TAYLOR & FRANCIS LTD,NA +emerita,0013-6662,1988-8384,NA,1,0,0,0,NA,NA,Classics,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +emily dickinson journal,1059-6879,1096-858X,NA,1,0,0,0,NA,NA,"Literature, American | Poetry",JOHNS HOPKINS UNIV PRESS,NA +emirates journal of food and agriculture,2079-052X,2079-0538,NA,0,0,1,0,Agronomy | Food Science & Technology,NA,NA,UNITED ARAB EMIRATES UNIV,NA +emotion,1528-3542,1931-1516,NA,0,1,0,0,NA,"Psychology, Experimental",NA,AMER PSYCHOLOGICAL ASSOC,NA +emotion review,1754-0739,1754-0747,Emotion_Review,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,2018-04-04 +emotion space and society,1755-4586,1878-0040,emospasoc,0,1,0,1,NA,"Geography | Social Sciences, Interdisciplinary",NA,ELSEVIER SCI LTD,2021-02-17 +empirica,0340-8744,1573-6911,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +empirical economics,0377-7332,1435-8921,NA,0,1,0,0,NA,"Economics | Social Sciences, Mathematical Methods",NA,PHYSICA-VERLAG GMBH & CO,NA +empirical software engineering,1382-3256,1573-7616,emsejournal,0,0,1,1,"Computer Science, Software Engineering",NA,NA,SPRINGER,2017-04-10 +empirical studies of the arts,0276-2374,1541-4493,EmpStudArts,1,1,0,1,NA,"Psychology, Multidisciplinary","Humanities, Multidisciplinary",SAGE PUBLICATIONS INC,2017-07-13 +empirical studies of the arts,0276-2374,1541-4493,EmpStudArts,1,1,0,1,NA,"Psychology, Multidisciplinary","Humanities, Multidisciplinary",SAGE PUBLICATIONS INC,2017-07-13 +employee relations,0142-5455,1758-7069,NA,0,1,0,0,NA,Industrial Relations & Labor | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +emu-austral ornithology,0158-4197,1448-5540,NA,0,0,1,0,Ornithology,NA,NA,TAYLOR & FRANCIS AUSTRALASIA,NA +encephale-revue de psychiatrie clinique biologique et therapeutique,0013-7006,NA,NA,0,0,1,0,Neurosciences | Psychiatry,NA,NA,MASSON EDITEUR,NA +endangered species research,1863-5407,1613-4796,ESR_IR,0,0,1,1,Biodiversity Conservation,NA,NA,INTER-RESEARCH,2016-07-27 +endeavour,0160-9327,1873-1929,NA,0,0,1,0,History & Philosophy Of Science | Multidisciplinary Sciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +endocrine,1355-008X,1559-0100,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER,NA +endocrine-related cancer,1351-0088,1479-6821,EndoCancer,0,0,1,1,Oncology | Endocrinology & Metabolism,NA,NA,BIOSCIENTIFICA LTD,2014-08-14 +endocrine connections,2049-3614,2049-3614,EndoConnect,0,0,1,1,Endocrinology & Metabolism,NA,NA,BIOSCIENTIFICA LTD,2012-05-17 +endocrine journal,0918-8959,1348-4540,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,JAPAN ENDOCRINE SOC,NA +endocrine metabolic & immune disorders-drug targets,1871-5303,2212-3873,NA,0,0,1,0,Endocrinology & Metabolism | Immunology | Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +endocrine pathology,1046-3976,1559-0097,EndoPath,0,0,1,1,Endocrinology & Metabolism | Pathology,NA,NA,HUMANA PRESS INC,2017-03-05 +endocrine practice,1530-891X,1934-2403,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ELSEVIER INC,NA +endocrine research,0743-5800,1532-4206,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,TAYLOR & FRANCIS INC,NA +endocrine reviews,0163-769X,1945-7189,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ENDOCRINE SOC,NA +endocrinologia diabetes y nutricion,2530-0180,2530-0180,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,ELSEVIER,NA +endocrinology,0013-7227,1945-7170,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ENDOCRINE SOC,NA +endocrinology and metabolism,2093-596X,2093-5978,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,KOREAN ENDOCRINE SOC,NA +endocrinology and metabolism clinics of north america,0889-8529,1558-4410,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +endokrynologia polska,0423-104X,2299-8306,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,VIA MEDICA,NA +endoscopic ultrasound,2303-9027,2226-7190,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +endoscopy,0013-726X,1438-8812,endoscopyjrnl,0,0,1,1,Gastroenterology & Hepatology | Surgery,NA,NA,GEORG THIEME VERLAG KG,2018-12-14 +energies,1996-1073,1996-1073,NA,0,0,1,0,Energy & Fuels,NA,NA,MDPI,NA +energy,0360-5442,1873-6785,NA,0,0,1,0,Thermodynamics | Energy & Fuels,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +energy & environment,0958-305X,2048-4070,NA,0,1,0,0,NA,Environmental Studies,NA,SAGE PUBLICATIONS LTD,NA +energy & environmental materials,2575-0356,2575-0356,EEMZZU1,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,WILEY,2021-11-16 +energy & environmental science,1754-5692,1754-5706,EES_journal,0,0,1,1,"Chemistry, Multidisciplinary | Energy & Fuels | Engineering, Chemical | Environmental Sciences",NA,NA,ROYAL SOC CHEMISTRY,2009-03-10 +energy & fuels,0887-0624,1520-5029,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical",NA,NA,AMER CHEMICAL SOC,NA +energy and buildings,0378-7788,1872-6178,NA,0,0,1,0,"Construction & Building Technology | Energy & Fuels | Engineering, Civil",NA,NA,ELSEVIER SCIENCE SA,NA +energy conversion and management,0196-8904,1879-2227,NA,0,0,1,0,Thermodynamics | Energy & Fuels | Mechanics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +energy economics,0140-9883,1873-6181,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +energy efficiency,1570-646X,1570-6478,NA,0,1,1,0,Green & Sustainable Science & Technology | Energy & Fuels,Green & Sustainable Science & Technology | Environmental Studies,NA,SPRINGER,NA +energy efficiency,1570-646X,1570-6478,NA,0,1,1,0,Green & Sustainable Science & Technology | Energy & Fuels,Green & Sustainable Science & Technology | Environmental Studies,NA,SPRINGER,NA +energy exploration & exploitation,0144-5987,2048-4054,NA,0,0,1,0,Energy & Fuels,NA,NA,SAGE PUBLICATIONS INC,NA +energy for sustainable development,0973-0826,2352-4669,NA,0,0,1,0,Green & Sustainable Science & Technology | Energy & Fuels,NA,NA,ELSEVIER,NA +energy journal,0195-6574,1944-9089,JournalEnergy,0,1,1,1,Energy & Fuels,Economics | Environmental Studies,NA,INT ASSOC ENERGY ECONOMICS,2018-09-29 +energy journal,0195-6574,1944-9089,JournalEnergy,0,1,1,1,Energy & Fuels,Economics | Environmental Studies,NA,INT ASSOC ENERGY ECONOMICS,2018-09-29 +energy policy,0301-4215,1873-6777,NA,0,1,1,0,Energy & Fuels | Environmental Sciences,Economics | Environmental Studies,NA,ELSEVIER SCI LTD,NA +energy policy,0301-4215,1873-6777,NA,0,1,1,0,Energy & Fuels | Environmental Sciences,Economics | Environmental Studies,NA,ELSEVIER SCI LTD,NA +energy reports,2352-4847,2352-4847,NA,0,0,1,0,Energy & Fuels,NA,NA,ELSEVIER,NA +energy research & social science,2214-6296,2214-6326,NA,0,1,0,0,NA,Environmental Studies,NA,ELSEVIER,NA +energy science & engineering,2050-0505,2050-0505,NA,0,0,1,0,Energy & Fuels,NA,NA,WILEY,NA +energy sources part a-recovery utilization and environmental effects,1556-7036,1556-7230,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical",NA,NA,TAYLOR & FRANCIS INC,NA +energy sources part b-economics planning and policy,1556-7249,1556-7257,NA,0,0,1,0,Energy & Fuels,NA,NA,TAYLOR & FRANCIS INC,NA +energy storage materials,2405-8297,2405-8297,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +energy strategy reviews,2211-467X,2211-4688,NA,0,0,1,0,Energy & Fuels,NA,NA,ELSEVIER,NA +energy sustainability and society,2192-0567,2192-0567,UFZ_ESSOJournal,0,0,1,1,Green & Sustainable Science & Technology | Energy & Fuels,NA,NA,BMC,2020-03-16 +energy technology,2194-4288,2194-4296,NA,0,0,1,0,Energy & Fuels,NA,NA,WILEY-V C H VERLAG GMBH,NA +eneuro,2373-2822,2373-2822,NA,0,0,1,0,Neurosciences,NA,NA,SOC NEUROSCIENCE,NA +enfermedades infecciosas y microbiologia clinica,0213-005X,1578-1852,NA,0,0,1,0,Infectious Diseases | Microbiology,NA,NA,EDICIONES DOYMA S A,NA +engenharia agricola,0100-6916,0100-6916,NA,0,0,1,0,Agricultural Engineering,NA,NA,SOC BRASIL ENGENHARIA AGRICOLA,NA +engenharia sanitaria e ambiental,1413-4152,1809-4457,NA,0,0,1,0,Water Resources,NA,NA,ASSOC BRASILEIRA ENGENHARIA SANITARIA AMBIENTAL,NA +engineering,2095-8099,2096-0026,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,ELSEVIER,NA +engineering analysis with boundary elements,0955-7997,1873-197X,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,ELSEVIER SCI LTD,NA +engineering applications of artificial intelligence,0952-1976,1873-6769,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Artificial Intelligence | Engineering, Multidisciplinary | Engineering, Electrical & Electronic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +engineering applications of computational fluid mechanics,1994-2060,1997-003X,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Mechanical | Mechanics",NA,NA,TAYLOR & FRANCIS LTD,NA +engineering computations,0264-4401,1758-7077,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications | Mechanics",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +engineering construction and architectural management,0969-9988,1365-232X,NA,0,1,1,0,"Engineering, Industrial | Engineering, Civil",Management,NA,EMERALD GROUP PUBLISHING LTD,NA +engineering construction and architectural management,0969-9988,1365-232X,NA,0,1,1,0,"Engineering, Industrial | Engineering, Civil",Management,NA,EMERALD GROUP PUBLISHING LTD,NA +engineering economist,0013-791X,1547-2701,NA,0,1,1,0,"Engineering, Industrial | Operations Research & Management Science",Business | Management,NA,TAYLOR & FRANCIS INC,NA +engineering economist,0013-791X,1547-2701,NA,0,1,1,0,"Engineering, Industrial | Operations Research & Management Science",Business | Management,NA,TAYLOR & FRANCIS INC,NA +engineering failure analysis,1350-6307,1873-1961,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Characterization, Testing",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +engineering fracture mechanics,0013-7944,1873-7315,NA,0,0,1,0,Mechanics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +engineering geology,0013-7952,1872-6917,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +engineering in life sciences,1618-0240,1618-2863,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,WILEY,NA +engineering journal-american institute of steel construction,0013-8029,0013-8029,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,AMER INST STEEL CONSTRUCTION,NA +engineering management journal,1042-9247,2377-0643,NA,0,1,1,0,"Engineering, Industrial",Management,NA,TAYLOR & FRANCIS LTD,NA +engineering management journal,1042-9247,2377-0643,NA,0,1,1,0,"Engineering, Industrial",Management,NA,TAYLOR & FRANCIS LTD,NA +engineering optimization,0305-215X,1029-0273,NA,0,0,1,0,"Engineering, Multidisciplinary | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS LTD,NA +engineering science and technology-an international journal-jestech,2215-0986,2215-0986,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,ELSEVIER - DIVISION REED ELSEVIER INDIA PVT LTD,NA +engineering structures,0141-0296,1873-7323,NA,0,0,1,0,"Engineering, Civil",NA,NA,ELSEVIER SCI LTD,NA +engineering studies,1937-8629,1940-8374,EngrStudies,0,1,1,1,"Education, Scientific Disciplines | Engineering, Multidisciplinary | History & Philosophy Of Science",History & Philosophy Of Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-04-09 +engineering studies,1937-8629,1940-8374,EngrStudies,0,1,1,1,"Education, Scientific Disciplines | Engineering, Multidisciplinary | History & Philosophy Of Science",History & Philosophy Of Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-04-09 +engineering with computers,0177-0667,1435-5663,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Mechanical",NA,NA,SPRINGER,NA +english,0013-8215,1756-1124,English_Jnl,1,0,0,1,NA,NA,Literature,OXFORD UNIV PRESS,2021-02-17 +english for specific purposes,0889-4906,1873-1937,NA,0,1,0,0,NA,Linguistics,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +english historical review,0013-8266,1477-4534,enghistrev,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2012-03-23 +english historical review,0013-8266,1477-4534,enghistrev,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2012-03-23 +english in australia,0046-208X,0155-2147,NA,0,1,0,0,NA,Education & Educational Research,NA,AATE-AUSTRALIAN ASSOC TEACHING ENGLISH,NA +english in education,0425-0494,1754-8845,NA,0,1,0,0,NA,Education & Educational Research,NA,TAYLOR & FRANCIS LTD,NA +english language & linguistics,1360-6743,1469-4379,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +english language & linguistics,1360-6743,1469-4379,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +english language notes,0013-8282,2573-3575,eln_cu,1,0,0,1,NA,NA,Literature,UNIV COLORADO,2021-05-21 +english literary renaissance,0013-8312,1475-6757,NA,1,0,0,0,NA,NA,"Literature, British Isles | Medieval & Renaissance Studies",UNIV CHICAGO PRESS,NA +english literature in transition 1880-1920,0013-8339,1559-2715,NA,1,0,0,0,NA,NA,"Literature, British Isles",ENGLISH LITERATURE TRANSITION,NA +english studies,0013-838X,1744-4217,ES_Routledge,1,0,0,1,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-02-28 +english studies in africa,0013-8398,1943-8117,NA,1,0,0,0,NA,NA,Literature,TAYLOR & FRANCIS LTD,NA +english studies in canada,0317-0802,1913-4835,ESCJourn,1,0,0,1,NA,NA,Literature,ASSOC CANADIAN COLL & UNIV TEACHERS ENGLISH,2018-07-15 +english teaching-practice and critique,1175-8708,1175-8708,EngTchingPrCr,1,1,0,1,NA,Education & Educational Research | Linguistics,Language & Linguistics,EMERALD GROUP PUBLISHING LTD,2018-05-16 +english teaching-practice and critique,1175-8708,1175-8708,EngTchingPrCr,1,1,0,1,NA,Education & Educational Research | Linguistics,Language & Linguistics,EMERALD GROUP PUBLISHING LTD,2018-05-16 +english today,0266-0784,1474-0567,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +english today,0266-0784,1474-0567,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +english world-wide,0172-8865,1569-9730,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +english world-wide,0172-8865,1569-9730,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +ensenanza de las ciencias,0212-4521,2174-6486,EnsenanzaC,0,1,0,1,NA,Education & Educational Research,NA,UNIV AUTONOMA BARCELONA,NA +ent-ear nose & throat journal,0145-5613,1942-7522,NA,0,0,1,0,Otorhinolaryngology,NA,NA,SAGE PUBLICATIONS INC,NA +enterprise & society,1467-2227,1467-2235,EntandSoc,0,1,0,1,NA,Business | History Of Social Sciences,NA,CAMBRIDGE UNIV PRESS,2021-08-20 +enterprise information systems,1751-7575,1751-7583,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,TAYLOR & FRANCIS LTD,NA +entertainment computing,1875-9521,1875-953X,NA,0,0,1,0,"Computer Science, Cybernetics | Computer Science, Interdisciplinary Applications | Computer Science, Software Engineering",NA,NA,ELSEVIER SCI LTD,NA +entomologia experimentalis et applicata,0013-8703,1570-7458,Ento_EA,0,0,1,1,Entomology,NA,NA,WILEY,2018-03-01 +entomologia generalis,0171-8177,2363-7102,EntomologiaG,0,0,1,1,Entomology,NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,2018-07-02 +entomologica americana,1947-5136,1947-5144,NA,0,0,1,0,Entomology,NA,NA,NEW YORK ENTOMOLOGICAL SOC INC,NA +entomological news,0013-872X,2162-3236,NA,0,0,1,0,Entomology,NA,NA,AMER ENTOMOL SOC,NA +entomological research,1738-2297,1748-5967,NA,0,0,1,0,Entomology,NA,NA,WILEY,NA +entomological science,1343-8786,1479-8298,NA,0,0,1,0,Entomology,NA,NA,WILEY,NA +entrepreneurship and regional development,0898-5626,1464-5114,ERD_IntJournal,0,1,0,1,NA,Business | Development Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-02-10 +entrepreneurship research journal,2194-6175,2157-5665,NA,0,1,0,0,NA,Business,NA,WALTER DE GRUYTER GMBH,NA +entrepreneurship theory and practice,1042-2587,1540-6520,ETPjournal,0,1,0,1,NA,Business,NA,SAGE PUBLICATIONS INC,2017-12-29 +entropy,1099-4300,1099-4300,Entropy_MDPI,0,0,1,1,"Physics, Multidisciplinary",NA,NA,MDPI,2015-09-08 +environment,0013-9157,1939-9154,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +environment,0013-9157,1939-9154,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +environment and behavior,0013-9165,1552-390X,NA,0,1,0,0,NA,"Environmental Studies | Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +environment and development economics,1355-770X,1469-4395,NA,0,1,0,0,NA,Economics | Environmental Studies,NA,CAMBRIDGE UNIV PRESS,NA +environment and history,0967-3407,1752-7023,Environ_History,1,1,0,1,NA,History | Environmental Studies,History,WHITE HORSE PRESS,2021-09-29 +environment and history,0967-3407,1752-7023,Environ_History,1,1,0,1,NA,History | Environmental Studies,History,WHITE HORSE PRESS,2021-09-29 +environment and planning a-economy and space,0308-518X,1472-3409,economyandspace,0,1,0,1,NA,Environmental Studies | Geography,NA,SAGE PUBLICATIONS INC,2014-03-31 +environment and planning b-urban analytics and city science,2399-8083,2399-8091,envplanb,0,1,0,1,NA,Environmental Studies | Geography | Regional & Urban Planning | Urban Studies,NA,SAGE PUBLICATIONS LTD,2017-06-20 +environment and planning c-politics and space,2399-6544,2399-6552,envplanc,0,1,0,1,NA,Environmental Studies | Geography | Regional & Urban Planning | Public Administration,NA,SAGE PUBLICATIONS LTD,2016-08-19 +environment and planning d-society & space,0263-7758,1472-3433,SocietyandSpace,0,1,0,1,NA,Environmental Studies | Geography,NA,SAGE PUBLICATIONS LTD,2011-09-22 +environment and planning e-nature and space,2514-8486,2514-8494,envplane,0,1,0,1,NA,Environmental Studies | Geography,NA,SAGE PUBLICATIONS INC,2017-05-24 +environment and urbanization,0956-2478,1746-0301,NA,0,1,0,0,NA,Environmental Studies | Urban Studies,NA,SAGE PUBLICATIONS LTD,NA +environment development and sustainability,1387-585X,1573-2975,NA,0,0,1,0,Green & Sustainable Science & Technology | Environmental Sciences,NA,NA,SPRINGER,NA +environment international,0160-4120,1873-6750,env_int_journal,0,0,1,1,Environmental Sciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2018-08-29 +environment protection engineering,0324-8828,2450-260X,NA,0,0,1,0,"Engineering, Environmental",NA,NA,TECHNICAL UNIV WROCLAW,NA +environmental & engineering geoscience,1078-7275,1558-9161,NA,0,0,1,0,"Engineering, Environmental | Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,"GEOLOGICAL SOC AMER, INC",NA +environmental & resource economics,0924-6460,1573-1502,NA,0,1,0,0,NA,Economics | Environmental Studies,NA,SPRINGER,NA +environmental and ecological statistics,1352-8505,1573-3009,NA,0,0,1,0,"Environmental Sciences | Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,SPRINGER,NA +environmental and experimental botany,0098-8472,1873-7307,NA,0,0,1,0,Plant Sciences | Environmental Sciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +environmental and molecular mutagenesis,0893-6692,1098-2280,NA,0,0,1,0,Environmental Sciences | Genetics & Heredity | Toxicology,NA,NA,WILEY,NA +environmental archaeology,1461-4103,1749-6314,NA,1,0,1,0,"Geosciences, Multidisciplinary",NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +environmental archaeology,1461-4103,1749-6314,NA,1,0,1,0,"Geosciences, Multidisciplinary",NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +environmental biology of fishes,0378-1909,1573-5133,NA,0,0,1,0,Ecology | Marine & Freshwater Biology,NA,NA,SPRINGER,NA +environmental chemistry,1448-2517,1449-8979,NA,0,0,1,0,"Chemistry, Analytical | Environmental Sciences",NA,NA,CSIRO PUBLISHING,NA +environmental chemistry letters,1610-3653,1610-3661,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Environmental | Environmental Sciences",NA,NA,SPRINGER HEIDELBERG,NA +environmental communication-a journal of nature and culture,1752-4032,1752-4040,NA,0,1,0,0,NA,Communication | Environmental Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +environmental conservation,0376-8929,1469-4387,EnvConsJournal,0,0,1,1,Biodiversity Conservation | Environmental Sciences,NA,NA,CAMBRIDGE UNIV PRESS,2019-01-27 +environmental development,2211-4645,2211-4653,NA,0,0,1,0,Environmental Sciences,NA,NA,ELSEVIER,NA +environmental earth sciences,1866-6280,1866-6299,NA,0,0,1,0,"Environmental Sciences | Geosciences, Multidisciplinary | Water Resources",NA,NA,SPRINGER,NA +environmental education research,1350-4622,1469-5871,eerjournal,0,1,0,1,NA,Education & Educational Research | Environmental Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-03-04 +environmental engineering and management journal,1582-9596,1843-3707,NA,0,0,1,0,Environmental Sciences,NA,NA,GH ASACHI TECHNICAL UNIV IASI,NA +environmental engineering research,1226-1025,2005-968X,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,KOREAN SOC ENVIRONMENTAL ENGINEERS,NA +environmental engineering science,1092-8758,1557-9018,EnvEngSciJrnl,0,0,1,1,"Engineering, Environmental | Environmental Sciences",NA,NA,"MARY ANN LIEBERT, INC",2020-04-02 +environmental entomology,0046-225X,1938-2936,NA,0,0,1,0,Entomology,NA,NA,OXFORD UNIV PRESS INC,NA +environmental ethics,0163-4275,2153-7895,NA,0,1,0,0,NA,Ethics | Environmental Studies,NA,ENVIRONMENTAL PHILOSOPHY INC,NA +environmental evidence,2047-2382,2047-2382,NA,0,0,1,0,Environmental Sciences,NA,NA,BMC,NA +environmental fluid mechanics,1567-7419,1573-1510,NA,0,0,1,0,Environmental Sciences | Mechanics | Meteorology & Atmospheric Sciences | Oceanography | Water Resources,NA,NA,SPRINGER,NA +environmental forensics,1527-5922,1527-5930,NA,0,0,1,0,Environmental Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +environmental geochemistry and health,0269-4042,1573-2983,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences | Public, Environmental & Occupational Health | Water Resources",NA,NA,SPRINGER,NA +environmental geotechnics,2051-803X,2051-803X,NA,0,0,1,0,"Engineering, Geological",NA,NA,ICE PUBLISHING,NA +environmental hazards-human and policy dimensions,1747-7891,1878-0059,NA,0,1,0,0,NA,Environmental Studies,NA,TAYLOR & FRANCIS LTD,NA +environmental health,1476-069X,1476-069X,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,BMC,NA +environmental health and preventive medicine,1342-078X,1347-4715,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SPRINGER,NA +environmental health and preventive medicine,1342-078X,1347-4715,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SPRINGER,NA +environmental health perspectives,0091-6765,1552-9924,EHPonline,0,0,1,1,"Environmental Sciences | Public, Environmental & Occupational Health | Toxicology",NA,NA,US DEPT HEALTH HUMAN SCIENCES PUBLIC HEALTH SCIENCE,2009-07-22 +environmental history,1084-5453,1930-8892,envhistjournal,1,1,0,1,NA,History | Environmental Studies,History,OXFORD UNIV PRESS INC,2013-10-12 +environmental history,1084-5453,1930-8892,envhistjournal,1,1,0,1,NA,History | Environmental Studies,History,OXFORD UNIV PRESS INC,2013-10-12 +environmental impact assessment review,0195-9255,1873-6432,NA,0,1,0,0,NA,Environmental Studies,NA,ELSEVIER SCIENCE INC,NA +environmental innovation and societal transitions,2210-4224,2210-4232,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,ELSEVIER,NA +environmental innovation and societal transitions,2210-4224,2210-4232,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,ELSEVIER,NA +environmental management,0364-152X,1432-1009,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +environmental microbiology,1462-2912,1462-2920,NA,0,0,1,0,Microbiology,NA,NA,WILEY,NA +environmental microbiology reports,1758-2229,1758-2229,NA,0,0,1,0,Environmental Sciences | Microbiology,NA,NA,WILEY,NA +environmental microbiome,NA,2524-6372,NA,0,0,1,0,Genetics & Heredity | Microbiology,NA,NA,BMC,NA +environmental modeling & assessment,1420-2026,1573-2967,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +environmental modelling & software,1364-8152,1873-6726,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Environmental | Environmental Sciences | Water Resources",NA,NA,ELSEVIER SCI LTD,NA +environmental monitoring and assessment,0167-6369,1573-2959,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +environmental policy and governance,1756-932X,1756-9338,NA,0,1,0,0,NA,Environmental Studies,NA,"WILEY PERIODICALS, INC",NA +environmental politics,0964-4016,1743-8934,env_pol,0,1,0,1,NA,Environmental Studies | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-02-20 +environmental pollutants and bioavailability,2639-5932,2639-5940,NA,0,0,1,0,Biochemistry & Molecular Biology | Environmental Sciences | Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +environmental pollution,0269-7491,1873-6424,NA,0,0,1,0,Environmental Sciences,NA,NA,ELSEVIER SCI LTD,NA +environmental progress & sustainable energy,1944-7442,1944-7450,NA,0,0,1,0,"Green & Sustainable Science & Technology | Engineering, Environmental | Engineering, Chemical | Environmental Sciences",NA,NA,WILEY,NA +environmental research,0013-9351,1096-0953,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +environmental research communications,2515-7620,2515-7620,NA,0,0,1,0,Environmental Sciences,NA,NA,IOP PUBLISHING LTD,NA +environmental research letters,1748-9326,1748-9326,NA,0,0,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,IOP PUBLISHING LTD,NA +environmental reviews,1208-6053,1181-8700,NA,0,0,1,0,Environmental Sciences,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +environmental science-nano,2051-8153,2051-8161,NA,0,0,1,0,"Chemistry, Multidisciplinary | Environmental Sciences | Nanoscience & Nanotechnology",NA,NA,ROYAL SOC CHEMISTRY,NA +environmental science-processes & impacts,2050-7887,2050-7895,NA,0,0,1,0,"Chemistry, Analytical | Environmental Sciences",NA,NA,ROYAL SOC CHEMISTRY,NA +environmental science-water research & technology,2053-1400,2053-1419,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences | Water Resources",NA,NA,ROYAL SOC CHEMISTRY,NA +environmental science & policy,1462-9011,1873-6416,NA,0,0,1,0,Environmental Sciences,NA,NA,ELSEVIER SCI LTD,NA +environmental science & technology,0013-936X,1520-5851,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,AMER CHEMICAL SOC,NA +environmental science & technology letters,2328-8930,2328-8930,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,AMER CHEMICAL SOC,NA +environmental science and pollution research,0944-1344,1614-7499,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER HEIDELBERG,NA +environmental sciences europe,2190-4707,2190-4715,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +environmental technology,0959-3330,1479-487X,NA,0,0,1,0,Environmental Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +environmental technology & innovation,2352-1864,2352-1864,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Engineering, Environmental | Environmental Sciences",NA,NA,ELSEVIER,NA +environmental toxicology,1520-4081,1522-7278,NA,0,0,1,0,Environmental Sciences | Toxicology | Water Resources,NA,NA,WILEY,NA +environmental toxicology and chemistry,0730-7268,1552-8618,etc_editor,0,0,1,1,Environmental Sciences | Toxicology,NA,NA,WILEY,2014-05-01 +environmental toxicology and pharmacology,1382-6689,1872-7077,NA,0,0,1,0,Environmental Sciences | Pharmacology & Pharmacy | Toxicology,NA,NA,ELSEVIER,NA +environmental values,0963-2719,1752-7015,J_EnvValues,0,1,0,1,NA,Ethics | Environmental Studies,NA,WHITE HORSE PRESS,2013-07-19 +environmetrics,1180-4009,1099-095X,NA,0,0,1,0,"Environmental Sciences | Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,WILEY,NA +enzyme and microbial technology,0141-0229,1879-0909,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,ELSEVIER SCIENCE INC,NA +epe journal,0939-8368,2376-9319,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,TAYLOR & FRANCIS LTD,NA +ephemerides theologicae lovanienses,0013-9513,1783-1423,NA,1,0,0,0,NA,NA,Religion,PEETERS,NA +epidemics,1755-4365,1878-0067,NA,0,0,1,0,Infectious Diseases,NA,NA,ELSEVIER,NA +epidemiologia & prevenzione,1120-9763,2385-1937,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,INFERENZE SCARL,NA +epidemiologia & prevenzione,1120-9763,2385-1937,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,INFERENZE SCARL,NA +epidemiologic reviews,0193-936X,1478-6729,EpiReviews,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,OXFORD UNIV PRESS INC,2018-01-25 +epidemiologie mikrobiologie imunologie,1210-7913,NA,NA,0,0,1,0,Microbiology,NA,NA,CESKA LEKARSKA SPOLECNOST J EV PURKYNE,NA +epidemiology,1044-3983,1531-5487,EpidemiologyLWW,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,LIPPINCOTT WILLIAMS & WILKINS,2010-12-20 +epidemiology,1044-3983,1531-5487,EpidemiologyLWW,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,LIPPINCOTT WILLIAMS & WILKINS,2010-12-20 +epidemiology and health,2092-7193,2092-7193,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,KOREAN SOC EPIDEMIOLOGY,NA +epidemiology and infection,0950-2688,1469-4409,Epidemio_Infect,0,0,1,1,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,CAMBRIDGE UNIV PRESS,2019-04-04 +epidemiology and psychiatric sciences,2045-7960,2045-7979,NA,0,1,1,0,Psychiatry,Psychiatry,NA,CAMBRIDGE UNIV PRESS,NA +epidemiology and psychiatric sciences,2045-7960,2045-7979,NA,0,1,1,0,Psychiatry,Psychiatry,NA,CAMBRIDGE UNIV PRESS,NA +epigenetics,1559-2294,1559-2308,EpigeneticsJ,0,0,1,1,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,TAYLOR & FRANCIS INC,2018-10-22 +epigenetics & chromatin,1756-8935,1756-8935,EpigenChromatin,0,0,1,1,Genetics & Heredity,NA,NA,BMC,2012-04-24 +epigenomics,1750-1911,1750-192X,EpigenomicsFSG,0,0,1,1,Genetics & Heredity,NA,NA,FUTURE MEDICINE LTD,2014-07-15 +epilepsia,0013-9580,1528-1167,EpilepsiaJourn,0,0,1,1,Clinical Neurology,NA,NA,WILEY,2014-01-31 +epilepsia open,2470-9239,2470-9239,EpilepsiaOpen,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,WILEY,2016-03-31 +epilepsy & behavior,1525-5050,1525-5069,EpilepsyBehavi1,0,0,1,1,Behavioral Sciences | Clinical Neurology | Psychiatry,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2019-06-03 +epilepsy currents,1535-7597,1535-7511,AESCurrents,0,0,1,1,Clinical Neurology,NA,NA,SAGE PUBLICATIONS INC,2021-01-15 +epilepsy research,0920-1211,1872-6844,NA,0,0,1,0,Clinical Neurology,NA,NA,ELSEVIER,NA +epileptic disorders,1294-9361,1950-6945,EpiDisorders,0,0,1,1,Clinical Neurology,NA,NA,JOHN LIBBEY EUROTEXT LTD,2017-01-31 +episodes,0705-3797,0705-3797,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,GEOLOGICAL SOC KOREA,NA +episteme-a journal of individual and social epistemology,1742-3600,1750-0117,NA,1,0,0,0,NA,NA,Philosophy,CAMBRIDGE UNIV PRESS,NA +epj data science,2193-1127,2193-1127,epj_ds,0,1,1,1,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods",NA,SPRINGER,2016-10-03 +epj data science,2193-1127,2193-1127,epj_ds,0,1,1,1,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods",NA,SPRINGER,2016-10-03 +epj quantum technology,2662-4400,2196-0763,NA,0,0,1,0,"Quantum Science & Technology | Optics | Physics, Atomic, Molecular & Chemical",NA,NA,SPRINGER,NA +epma journal,1878-5077,1878-5085,TheEPMAJournal,0,0,1,1,"Medicine, Research & Experimental",NA,NA,SPRINGER INT PUBL AG,2010-11-09 +equine veterinary education,0957-7734,2042-3292,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +equine veterinary journal,0425-1644,2042-3306,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +erde,0013-9998,0013-9998,NA,0,1,1,0,"Geography, Physical | Geosciences, Multidisciplinary",Geography,NA,GESELLSCHAFT ERDKUNDE BERLIN,NA +erde,0013-9998,0013-9998,NA,0,1,1,0,"Geography, Physical | Geosciences, Multidisciplinary",Geography,NA,GESELLSCHAFT ERDKUNDE BERLIN,NA +erdkunde,0014-0015,0014-0015,NA,0,1,1,0,"Geography, Physical",Geography,NA,"UNIV BONN, GEOGRAPHISCHES INST",NA +erdkunde,0014-0015,0014-0015,NA,0,1,1,0,"Geography, Physical",Geography,NA,"UNIV BONN, GEOGRAPHISCHES INST",NA +ergo-an open access journal of philosophy,2330-4014,2330-4014,ErgoEditors,1,0,0,1,NA,NA,Philosophy,MICHIGAN PUBLISHING,2014-04-30 +ergodic theory and dynamical systems,0143-3857,1469-4417,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,CAMBRIDGE UNIV PRESS,NA +ergonomics,0014-0139,1366-5847,ergonomics1957,0,1,1,1,"Engineering, Industrial | Psychology","Ergonomics | Psychology, Applied",NA,TAYLOR & FRANCIS LTD,2014-12-13 +ergonomics,0014-0139,1366-5847,ergonomics1957,0,1,1,1,"Engineering, Industrial | Psychology","Ergonomics | Psychology, Applied",NA,TAYLOR & FRANCIS LTD,2014-12-13 +erkenntnis,0165-0106,1572-8420,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +ernahrungs umschau,0174-0008,0174-0008,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,UMSCHAU VERLAG,NA +erwerbs-obstbau,0014-0309,1439-0302,NA,0,0,1,0,Horticulture,NA,NA,SPRINGER,NA +esaim-control optimisation and calculus of variations,1292-8119,1262-3377,NA,0,0,1,0,"Automation & Control Systems | Mathematics, Applied",NA,NA,EDP SCIENCES S A,NA +esaim-mathematical modelling and numerical analysis-modelisation mathematique et analyse numerique,0764-583X,1290-3841,NA,0,0,1,0,"Mathematics, Applied",NA,NA,EDP SCIENCES S A,NA +esaim-probability and statistics,1292-8100,1262-3318,NA,0,0,1,0,Statistics & Probability,NA,NA,EDP SCIENCES S A,NA +esc heart failure,2055-5822,2055-5822,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,"WILEY PERIODICALS, INC",NA +esmo open,2059-7029,2059-7029,ESMO_Open,0,0,1,1,Oncology,NA,NA,ELSEVIER,2015-09-22 +esophagus,1612-9059,1612-9067,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,SPRINGER JAPAN KK,NA +esprit,0014-0759,2111-4579,NA,1,0,0,0,NA,NA,Literary Reviews,ESPRIT,NA +esprit createur,0014-0767,1931-0234,NA,1,0,0,0,NA,NA,"Literature, Romance",JOHNS HOPKINS UNIV PRESS,NA +esq-a journal of the american renaissance,0093-8297,1935-021X,ESQJournal,1,0,0,1,NA,NA,"Literature, American",WASHINGTON STATE UNIV,2015-06-18 +essays in biochemistry,0071-1365,1744-1358,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,PORTLAND PRESS LTD,NA +essays in criticism,0014-0856,1471-6852,NA,1,0,0,0,NA,NA,Literature,OXFORD UNIV PRESS,NA +estetika-the european journal of aesthetics,NA,2571-0915,NA,1,0,0,0,NA,NA,Philosophy | Art,HELSINKI UNIV PRESS,NA +estonian journal of archaeology,1406-2933,1736-7484,NA,1,0,0,0,NA,NA,Archaeology,ESTONIAN ACAD PUBLISHERS,NA +estonian journal of earth sciences,1736-4728,1736-7557,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,ESTONIAN ACAD PUBLISHERS,NA +estreno-cuadernos del teatro espanol contemporaneo,0097-8663,NA,NA,1,0,0,0,NA,NA,Theater,ESTRENO,NA +estuaries and coasts,1559-2723,1559-2731,NA,0,0,1,0,Environmental Sciences | Marine & Freshwater Biology,NA,NA,SPRINGER,NA +estuarine coastal and shelf science,0272-7714,1096-0015,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +estudios atacamenos,0718-1043,0718-1043,reatacam,1,1,0,1,NA,History | Anthropology,History | Archaeology,UNIV CATOLICA NORTE,2015-03-23 +estudios atacamenos,0718-1043,0718-1043,reatacam,1,1,0,1,NA,History | Anthropology,History | Archaeology,UNIV CATOLICA NORTE,2015-03-23 +estudios de economia,0718-5286,0718-5286,NA,0,1,0,0,NA,Economics,NA,UNIV CHILE DEPT ECONOMICS,NA +estudios filologicos,0071-1713,0717-6171,NA,1,1,0,0,NA,Linguistics,"Language & Linguistics | Literature, Romance",UNIV AUSTRAL CHILE,NA +estudios filologicos,0071-1713,0717-6171,NA,1,1,0,0,NA,Linguistics,"Language & Linguistics | Literature, Romance",UNIV AUSTRAL CHILE,NA +estudios geologicos-madrid,0367-0449,1988-3250,NA,0,0,1,0,Geology,NA,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +estudos ibero-americanos,0101-4064,1980-864X,NA,1,0,0,0,NA,NA,History,PONTIFICIA UNIVERSIDADE CATOLICA DO RIO GRANDE SUL,NA +ethical perspectives,1370-0049,1783-1431,NA,1,1,0,0,NA,Ethics,Philosophy,PEETERS,NA +ethical perspectives,1370-0049,1783-1431,NA,1,1,0,0,NA,Ethics,Philosophy,PEETERS,NA +ethical theory and moral practice,1386-2820,1572-8447,ETMPjournal,1,0,0,1,NA,NA,Philosophy,SPRINGER,2020-06-09 +ethics,0014-1704,1539-297X,EthicsJournal,1,1,0,1,NA,Ethics,Philosophy,UNIV CHICAGO PRESS,2013-08-07 +ethics,0014-1704,1539-297X,EthicsJournal,1,1,0,1,NA,Ethics,Philosophy,UNIV CHICAGO PRESS,2013-08-07 +ethics & behavior,1050-8422,1532-7019,NA,0,1,0,0,NA,"Ethics | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +ethics & global politics,1654-4951,1654-6369,NA,0,1,0,0,NA,Ethics | Political Science,NA,TAYLOR & FRANCIS LTD,NA +ethics & international affairs,0892-6794,1747-7093,eiajournal,0,1,0,1,NA,Ethics | International Relations | Political Science,NA,CAMBRIDGE UNIV PRESS,2012-02-07 +ethics and information technology,1388-1957,1572-8439,NA,1,1,0,0,NA,Ethics | Information Science & Library Science,Philosophy,SPRINGER,NA +ethics and information technology,1388-1957,1572-8439,NA,1,1,0,0,NA,Ethics | Information Science & Library Science,Philosophy,SPRINGER,NA +ethik in der medizin,0935-7335,1437-1618,NA,0,0,1,0,Medical Ethics,NA,NA,SPRINGER,NA +ethiopian journal of health development,1021-6790,1021-6790,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"ADDIS ABABA UNIV, DEPT COMMUNITY HEALTH",NA +ethiopian journal of health development,1021-6790,1021-6790,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"ADDIS ABABA UNIV, DEPT COMMUNITY HEALTH",NA +ethnic and racial studies,0141-9870,1466-4356,ersjournal,0,1,0,1,NA,Ethnic Studies | Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-01-08 +ethnicities,1468-7968,1741-2706,EthnicitiesSAGE,0,1,0,1,NA,Ethnic Studies,NA,SAGE PUBLICATIONS LTD,2015-11-25 +ethnicity & disease,1049-510X,1945-0826,EthnicityD,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,"ETHNICITY & DISEASE, INC",2019-02-21 +ethnicity & health,1355-7858,1465-3419,EthnicityHealth,0,1,1,1,"Public, Environmental & Occupational Health",Ethnic Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-10-23 +ethnicity & health,1355-7858,1465-3419,EthnicityHealth,0,1,1,1,"Public, Environmental & Occupational Health",Ethnic Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-10-23 +ethnography,1466-1381,1741-2714,NA,0,1,0,0,NA,Anthropology | Sociology,NA,SAGE PUBLICATIONS LTD,NA +ethnohistory,0014-1801,1527-5477,NA,1,1,0,0,NA,History | Anthropology,History,DUKE UNIV PRESS,NA +ethnohistory,0014-1801,1527-5477,NA,1,1,0,0,NA,History | Anthropology,History,DUKE UNIV PRESS,NA +ethnologia scandinavica,0348-9698,0348-9698,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",SWEDISH SCIENCE PRESS,NA +ethnomusicology,0014-1836,2156-7417,NA,1,0,0,0,NA,NA,Music,SOC ETHNOMUSICOLOGY INC,NA +ethnomusicology forum,1741-1912,1741-1920,NA,1,0,0,0,NA,NA,Music,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +ethnos,0014-1844,1469-588X,NA,0,1,0,0,NA,Anthropology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +ethology,0179-1613,1439-0310,NA,0,0,1,0,Behavioral Sciences | Zoology,NA,NA,WILEY,NA +ethology ecology & evolution,0394-9370,1828-7131,NA,0,0,1,0,Behavioral Sciences | Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +ethos,0091-2131,1548-1352,NA,0,1,0,0,NA,"Anthropology | Psychology, Multidisciplinary",NA,WILEY,NA +etikk i praksis,1890-3991,1890-4009,redaksjoneip,1,1,0,1,NA,Ethics,Philosophy,"AKADEMIKA AS, AKADEMIKA FORLAG",2015-05-08 +etikk i praksis,1890-3991,1890-4009,redaksjoneip,1,1,0,1,NA,Ethics,Philosophy,"AKADEMIKA AS, AKADEMIKA FORLAG",2015-05-08 +etr&d-educational technology research and development,1042-1629,1556-6501,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +etransportation,2590-1168,2590-1168,NA,0,0,1,0,"Engineering, Electrical & Electronic | Transportation Science & Technology | Energy & Fuels",NA,NA,ELSEVIER,NA +etri journal,1225-6463,2233-7326,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,WILEY,NA +etudes anglaises,0014-195X,0014-195X,NA,1,0,0,0,NA,NA,Literature,KLINCKSIECK,NA +etudes classiques,0014-200X,0014-200X,NA,1,0,0,0,NA,NA,Classics,SOC ETUDES CLASSIQUES,NA +etudes francaises,0014-2085,1492-1405,Revue_EtudFra,1,0,0,1,NA,NA,"Literature, Romance",PRESSES UNIV MONTREAL,2016-01-29 +etudes germaniques,0014-2115,2426-5543,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",DIDIER-ERUDITION,NA +etudes litteraires,0014-214X,0014-214X,revue_el,1,0,0,1,NA,NA,"Literature, Romance",UNIV LAVAL,2018-11-13 +etudes philosophiques,0014-2166,2101-0056,NA,1,0,0,0,NA,NA,Philosophy,PRESSES UNIV FRANCE,NA +etudes theologiques et religieuses,0014-2239,2272-9011,NA,1,0,0,0,NA,NA,Religion,INST PROTESTANT THEOLOGIE,NA +euphorion-zeitschrift fur literaturgeschichte,0014-2328,0014-2328,NA,1,0,0,0,NA,NA,Literature,UNIVERSITATSVERLAG C WINTER HEIDELBERG GMBH,NA +euphrosyne-revista de filologia classica,0870-0133,2736-3082,NA,1,0,0,0,NA,NA,Classics,"UNIV LISBOA, FAC LETTERS, CENTRO ESTUDOS CLASSICOS",NA +euphytica,0014-2336,1573-5060,NA,0,0,1,0,Agronomy | Plant Sciences | Horticulture,NA,NA,SPRINGER,NA +eurasian business review,1309-4297,2147-4281,NA,0,1,0,0,NA,Business | Economics | Management,NA,SPRINGER HEIDELBERG,NA +eurasian geography and economics,1538-7216,1938-2863,NA,0,1,0,0,NA,Area Studies | Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +eurasian soil science,1064-2293,1556-195X,NA,0,0,1,0,Soil Science,NA,NA,PLEIADES PUBLISHING INC,NA +eurasip journal on advances in signal processing,1687-6180,1687-6180,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +eurasip journal on audio speech and music processing,1687-4722,1687-4722,NA,0,0,1,0,"Acoustics | Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +eurasip journal on image and video processing,1687-5176,1687-5281,NA,0,0,1,0,"Engineering, Electrical & Electronic | Imaging Science & Photographic Technology",NA,NA,SPRINGER,NA +eurasip journal on wireless communications and networking,1687-1472,1687-1499,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,SPRINGER,NA +eure-revista latinoamericana de estudios urbano regionales,0250-7161,0717-6236,RevistaEURE,0,1,0,1,NA,Urban Studies,NA,"PONTIFICIA UNIV CATOLICA CHILE, INST ESTUDIOS URBANOS TERRITORIALES",2010-07-06 +eurointervention,1774-024X,1969-6213,EuroInterventio,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,EUROPA EDITION,2011-05-05 +europace,1099-5129,1532-2092,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,OXFORD UNIV PRESS,NA +europe-asia studies,0966-8136,1465-3427,eurasiastudies,0,1,0,1,NA,Area Studies | Economics | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-02-02 +europe-revue litteraire mensuelle,0014-2751,0014-2751,NA,1,0,0,0,NA,NA,Literary Reviews,REVUE EUROPE,NA +european accounting review,0963-8180,1468-4497,EAR_Journal,0,1,0,1,NA,"Business, Finance",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-12-23 +european addiction research,1022-6877,1421-9891,NA,0,1,1,0,Substance Abuse | Psychiatry,Substance Abuse | Psychiatry,NA,KARGER,NA +european addiction research,1022-6877,1421-9891,NA,0,1,1,0,Substance Abuse | Psychiatry,Substance Abuse | Psychiatry,NA,KARGER,NA +european annals of otorhinolaryngology-head and neck diseases,1879-7296,1879-730X,NA,0,0,1,0,Otorhinolaryngology,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",NA +european archives of oto-rhino-laryngology,0937-4477,1434-4726,NA,0,0,1,0,Otorhinolaryngology,NA,NA,SPRINGER,NA +european archives of psychiatry and clinical neuroscience,0940-1334,1433-8491,NA,0,0,1,0,Clinical Neurology | Psychiatry,NA,NA,SPRINGER HEIDELBERG,NA +european biophysics journal with biophysics letters,0175-7571,1432-1017,NA,0,0,1,0,Biophysics,NA,NA,SPRINGER,NA +european business organization law review,1566-7529,1741-6205,NA,0,1,0,0,NA,Business | Law,NA,SPRINGER HEIDELBERG,NA +european cells & materials,1473-2262,1473-2262,NA,0,0,1,0,"Cell & Tissue Engineering | Engineering, Biomedical | Materials Science, Biomaterials | Orthopedics",NA,NA,AO RESEARCH INSTITUTE DAVOS-ARI,NA +european child & adolescent psychiatry,1018-8827,1435-165X,NA,0,1,1,0,Pediatrics | Psychiatry,"Psychiatry | Psychology, Development",NA,SPRINGER,NA +european child & adolescent psychiatry,1018-8827,1435-165X,NA,0,1,1,0,Pediatrics | Psychiatry,"Psychiatry | Psychology, Development",NA,SPRINGER,NA +european constitutional law review,1574-0196,1744-5515,eu_const,0,1,0,1,NA,Law,NA,CAMBRIDGE UNIV PRESS,2020-02-07 +european cytokine network,1148-5493,1952-4005,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology | Immunology,NA,NA,JOHN LIBBEY EUROTEXT LTD,NA +european early childhood education research journal,1350-293X,1752-1807,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european eating disorders review,1072-4133,1099-0968,NA,0,1,0,0,NA,"Psychology, Clinical",NA,WILEY,NA +european economic review,0014-2921,1873-572X,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +european educational research journal,1474-9041,1474-9041,EuropeanEducat3,0,1,0,1,NA,Education & Educational Research,NA,SAGE PUBLICATIONS LTD,2020-04-17 +european financial management,1354-7798,1468-036X,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +european food research and technology,1438-2377,1438-2385,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER,NA +european geriatric medicine,1878-7649,1878-7657,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,SPRINGER,NA +european heart journal,0195-668X,1522-9645,ehj_ed,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,OXFORD UNIV PRESS,2020-01-23 +european heart journal-acute cardiovascular care,2048-8726,2048-8734,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,OXFORD UNIV PRESS,NA +european heart journal-cardiovascular imaging,2047-2404,2047-2412,NA,0,0,1,0,"Cardiac & Cardiovascular System | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,OXFORD UNIV PRESS,NA +european heart journal-cardiovascular pharmacotherapy,2055-6837,2055-6845,NA,0,0,1,0,Cardiac & Cardiovascular System | Pharmacology & Pharmacy,NA,NA,OXFORD UNIV PRESS,NA +european heart journal-quality of care and clinical outcomes,2058-5225,2058-1742,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,OXFORD UNIV PRESS,NA +european heart journal supplements,1520-765X,1554-2815,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,OXFORD UNIV PRESS,NA +european history quarterly,0265-6914,1461-7110,NA,1,1,0,0,NA,History | Political Science,History,SAGE PUBLICATIONS LTD,NA +european history quarterly,0265-6914,1461-7110,NA,1,1,0,0,NA,History | Political Science,History,SAGE PUBLICATIONS LTD,NA +european journal for philosophy of religion,1689-8311,1689-8311,NA,1,0,0,0,NA,NA,Religion | Philosophy,EUROPEAN JOURNAL PHILOSOPHY RELIGION,NA +european journal for philosophy of science,1879-4912,1879-4920,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SPRINGER,NA +european journal for philosophy of science,1879-4912,1879-4920,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SPRINGER,NA +european journal of ageing,1613-9372,1613-9380,NA,0,1,0,0,NA,Gerontology,NA,SPRINGER,NA +european journal of agronomy,1161-0301,1873-7331,NA,0,0,1,0,Agronomy,NA,NA,ELSEVIER,NA +european journal of anaesthesiology,0265-0215,1365-2346,NA,0,0,1,0,Anesthesiology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +european journal of applied mathematics,0956-7925,1469-4425,NA,0,0,1,0,"Mathematics, Applied",NA,NA,CAMBRIDGE UNIV PRESS,NA +european journal of applied physiology,1439-6319,1439-6327,EJAP_official,0,0,1,1,Physiology | Sport Sciences,NA,NA,SPRINGER,2016-11-24 +european journal of archaeology,1461-9571,1741-2722,NA,1,0,0,0,NA,NA,Archaeology,CAMBRIDGE UNIV PRESS,NA +european journal of cancer,0959-8049,1879-0852,NA,0,0,1,0,Oncology,NA,NA,ELSEVIER SCI LTD,NA +european journal of cancer care,0961-5423,1365-2354,NA,0,1,1,0,Oncology | Health Care Sciences & Services | Nursing | Rehabilitation,Nursing | Rehabilitation,NA,WILEY,NA +european journal of cancer care,0961-5423,1365-2354,NA,0,1,1,0,Oncology | Health Care Sciences & Services | Nursing | Rehabilitation,Nursing | Rehabilitation,NA,WILEY,NA +european journal of cancer prevention,0959-8278,1473-5709,NA,0,0,1,0,Oncology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +european journal of cardio-thoracic surgery,1010-7940,1873-734X,NA,0,0,1,0,Cardiac & Cardiovascular System | Respiratory System | Surgery,NA,NA,OXFORD UNIV PRESS INC,NA +european journal of cardiovascular nursing,1474-5151,1873-1953,EditorEJCN,0,1,1,1,Cardiac & Cardiovascular System | Nursing,Nursing,NA,OXFORD UNIV PRESS,2017-07-14 +european journal of cardiovascular nursing,1474-5151,1873-1953,EditorEJCN,0,1,1,1,Cardiac & Cardiovascular System | Nursing,Nursing,NA,OXFORD UNIV PRESS,2017-07-14 +european journal of cell biology,0171-9335,1618-1298,NA,0,0,1,0,Cell Biology,NA,NA,ELSEVIER GMBH,NA +european journal of clinical investigation,0014-2972,1365-2362,EJCI_News,0,0,1,1,"Medicine, General & Internal | Medicine, Research & Experimental",NA,NA,WILEY,2020-10-07 +european journal of clinical microbiology & infectious diseases,0934-9723,1435-4373,NA,0,0,1,0,Infectious Diseases | Microbiology,NA,NA,SPRINGER,NA +european journal of clinical nutrition,0954-3007,1476-5640,ejcneditor,0,0,1,1,Nutrition & Dietetics,NA,NA,SPRINGERNATURE,2018-10-03 +european journal of clinical pharmacology,0031-6970,1432-1041,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGER HEIDELBERG,NA +european journal of combinatorics,0195-6698,1095-9971,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +european journal of communication,0267-3231,1460-3705,NA,0,1,0,0,NA,Communication,NA,SAGE PUBLICATIONS LTD,NA +european journal of contraception and reproductive health care,1362-5187,1473-0782,NA,0,0,1,0,"Public, Environmental & Occupational Health | Obstetrics & Gynecology",NA,NA,TAYLOR & FRANCIS LTD,NA +european journal of control,0947-3580,1435-5671,NA,0,0,1,0,Automation & Control Systems,NA,NA,ELSEVIER,NA +european journal of criminology,1477-3708,1741-2609,EJC_Eurocrim,0,1,0,1,NA,Criminology & Penology,NA,SAGE PUBLICATIONS LTD,2021-07-01 +european journal of cultural studies,1367-5494,1460-3551,EJCS_Journal,1,1,0,1,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS LTD,2014-12-12 +european journal of cultural studies,1367-5494,1460-3551,EJCS_Journal,1,1,0,1,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS LTD,2014-12-12 +european journal of dental education,1396-5883,1600-0579,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Education, Scientific Disciplines",NA,NA,WILEY,NA +european journal of dermatology,1167-1122,1952-4013,NA,0,0,1,0,Dermatology,NA,NA,JOHN LIBBEY EUROTEXT LTD,NA +european journal of development research,0957-8811,1743-9728,NA,0,1,0,0,NA,Development Studies,NA,PALGRAVE MACMILLAN LTD,NA +european journal of developmental psychology,1740-5629,1740-5610,NA,0,1,0,0,NA,"Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal of drug metabolism and pharmacokinetics,0378-7966,2107-0180,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGER FRANCE,NA +european journal of education,0141-8211,1465-3435,NA,0,1,0,0,NA,Education & Educational Research,NA,WILEY,NA +european journal of emergency medicine,0969-9546,1473-5695,NA,0,0,1,0,Emergency Medicine,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +european journal of endocrinology,0804-4643,1479-683X,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,BIOSCIENTIFICA LTD,NA +european journal of english studies,1382-5577,1744-4233,NA,1,1,0,0,NA,Cultural Studies | Linguistics,Literature | Cultural Studies | Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal of english studies,1382-5577,1744-4233,NA,1,1,0,0,NA,Cultural Studies | Linguistics,Literature | Cultural Studies | Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal of entomology,1802-8829,1802-8829,NA,0,0,1,0,Entomology,NA,NA,"CZECH ACAD SCI, INST ENTOMOLOGY",NA +european journal of environmental and civil engineering,1964-8189,2116-7214,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological",NA,NA,TAYLOR & FRANCIS LTD,NA +european journal of epidemiology,0393-2990,1573-7284,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,SPRINGER,NA +european journal of finance,1351-847X,1466-4364,NA,0,1,0,0,NA,"Business, Finance",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal of forest research,1612-4669,1612-4677,NA,0,0,1,0,Forestry,NA,NA,SPRINGER,NA +european journal of futures research,2195-4194,2195-2248,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SPRINGER,NA +european journal of gastroenterology & hepatology,0954-691X,1473-5687,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +european journal of general practice,1381-4788,1751-1402,NA,0,0,1,0,"Primary Health Care | Medicine, General & Internal",NA,NA,TAYLOR & FRANCIS LTD,NA +european journal of gynaecological oncology,0392-2936,0392-2936,EJGO_IMR,0,0,1,1,Oncology | Obstetrics & Gynecology,NA,NA,IMR PRESS,2020-04-03 +european journal of haematology,0902-4441,1600-0609,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +european journal of health economics,1618-7598,1618-7601,NA,0,1,0,0,NA,Economics | Health Policy & Services,NA,SPRINGER,NA +european journal of health psychology,2512-8442,2512-8450,EJHP_journal,0,1,0,1,NA,"Psychology, Clinical",NA,HOGREFE PUBLISHING CORP,2020-01-23 +european journal of heart failure,1388-9842,1879-0844,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,WILEY,NA +european journal of histochemistry,1121-760X,2038-8306,NA,0,0,1,0,Cell Biology,NA,NA,PAGEPRESS PUBL,NA +european journal of horticultural science,1611-4426,1611-4434,NA,0,0,1,0,Horticulture,NA,NA,INT SOC HORTICULTURAL SCIENCE-ISHS,NA +european journal of hospital pharmacy,2047-9956,2047-9964,EJHP_BMJ,0,0,1,1,Pharmacology & Pharmacy,NA,NA,BMJ PUBLISHING GROUP,2015-03-11 +european journal of human genetics,1018-4813,1476-5438,ejhg_journal,0,0,1,1,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,SPRINGERNATURE,2018-11-26 +european journal of immunology,0014-2980,1521-4141,EurJImmunol,0,0,1,1,Immunology,NA,NA,WILEY,2021-06-24 +european journal of industrial engineering,1751-5254,1751-5262,NA,0,0,1,0,"Engineering, Industrial | Operations Research & Management Science",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +european journal of industrial relations,0959-6801,1461-7129,EJIR_News,0,1,0,1,NA,Industrial Relations & Labor,NA,SAGE PUBLICATIONS LTD,2020-01-27 +european journal of inflammation,1721-727X,2058-7392,NA,0,0,1,0,Immunology,NA,NA,SAGE PUBLICATIONS INC,NA +european journal of information systems,0960-085X,1476-9344,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,TAYLOR & FRANCIS LTD,NA +european journal of information systems,0960-085X,1476-9344,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,TAYLOR & FRANCIS LTD,NA +european journal of innovation management,1460-1060,1758-7115,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +european journal of inorganic chemistry,1434-1948,1099-0682,EurJIC,0,0,1,1,"Chemistry, Inorganic & Nuclear",NA,NA,WILEY-V C H VERLAG GMBH,2014-11-10 +european journal of integrative medicine,1876-3820,1876-3839,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,ELSEVIER SCIENCE INC,NA +european journal of internal medicine,0953-6205,1879-0828,EJIM_journal,0,0,1,1,"Medicine, General & Internal",NA,NA,ELSEVIER,2019-11-18 +european journal of international law,0938-5428,1464-3596,ejiltalk,0,1,0,1,NA,International Relations | Law,NA,OXFORD UNIV PRESS,2012-09-27 +european journal of international management,1751-6757,1751-6765,NA,0,1,0,0,NA,Management,NA,INDERSCIENCE ENTERPRISES LTD,NA +european journal of international relations,1354-0661,1460-3713,eurojournir,0,1,0,1,NA,International Relations,NA,SAGE PUBLICATIONS LTD,2013-06-27 +european journal of jewish studies,1025-9996,1872-471X,EJJS_Journal,1,0,0,1,NA,NA,History | Religion,BRILL,2022-02-16 +european journal of law and economics,0929-1261,1572-9990,NA,0,1,0,0,NA,Economics | Law,NA,SPRINGER,NA +european journal of lipid science and technology,1438-7697,1438-9312,NA,0,0,1,0,Food Science & Technology | Nutrition & Dietetics,NA,NA,WILEY,NA +european journal of marketing,0309-0566,1758-7123,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +european journal of mass spectrometry,1469-0667,1751-6838,NA,0,0,1,0,"Physics, Atomic, Molecular & Chemical | Spectroscopy",NA,NA,SAGE PUBLICATIONS LTD,NA +european journal of mechanics a-solids,0997-7538,1873-7285,NA,0,0,1,0,Mechanics,NA,NA,ELSEVIER,NA +european journal of mechanics b-fluids,0997-7546,1873-7390,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,ELSEVIER,NA +european journal of medical genetics,1769-7212,1878-0849,NA,0,0,1,0,Genetics & Heredity,NA,NA,ELSEVIER,NA +european journal of medical research,0949-2321,2047-783X,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,BMC,NA +european journal of medicinal chemistry,0223-5234,1768-3254,NA,0,0,1,0,"Chemistry, Medicinal",NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +european journal of migration and law,1388-364X,1571-8166,NA,0,1,0,0,NA,Demography | Law,NA,BRILL,NA +european journal of mineralogy,0935-1221,1617-4011,EurJMineral,0,0,1,1,Mineralogy,NA,NA,COPERNICUS GESELLSCHAFT MBH,2020-01-29 +european journal of neurology,1351-5101,1468-1331,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,WILEY,NA +european journal of neuroscience,0953-816X,1460-9568,EJNeuroscience,0,0,1,1,Neurosciences,NA,NA,WILEY,2011-10-28 +european journal of nuclear medicine and molecular imaging,1619-7070,1619-7089,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +european journal of nutrition,1436-6207,1436-6215,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,SPRINGER HEIDELBERG,NA +european journal of obstetrics & gynecology and reproductive biology,0301-2115,1872-7654,NA,0,0,1,0,Obstetrics & Gynecology | Reproductive Biology,NA,NA,ELSEVIER,NA +european journal of oncology nursing,1462-3889,1532-2122,NA,0,1,1,0,Oncology | Nursing,Nursing,NA,ELSEVIER SCI LTD,NA +european journal of oncology nursing,1462-3889,1532-2122,NA,0,1,1,0,Oncology | Nursing,Nursing,NA,ELSEVIER SCI LTD,NA +european journal of operational research,0377-2217,1872-6860,NA,0,0,1,0,Operations Research & Management Science,NA,NA,ELSEVIER,NA +european journal of ophthalmology,1120-6721,1724-6016,NA,0,0,1,0,Ophthalmology,NA,NA,SAGE PUBLICATIONS LTD,NA +european journal of oral sciences,0909-8836,1600-0722,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +european journal of organic chemistry,1434-193X,1099-0690,EurJOC,0,0,1,1,"Chemistry, Organic",NA,NA,WILEY-V C H VERLAG GMBH,2016-08-09 +european journal of orthodontics,0141-5387,1460-2210,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,OXFORD UNIV PRESS,NA +european journal of paediatric dentistry,1591-996X,2035-648X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Pediatrics",NA,NA,ARIESDUE SRL,NA +european journal of paediatric neurology,1090-3798,1532-2130,NA,0,0,1,0,Clinical Neurology | Pediatrics,NA,NA,ELSEVIER SCI LTD,NA +european journal of pain,1090-3801,1532-2149,NA,0,0,1,0,Anesthesiology | Clinical Neurology | Neurosciences,NA,NA,WILEY,NA +european journal of pediatric surgery,0939-7248,1439-359X,NA,0,0,1,0,Pediatrics | Surgery,NA,NA,GEORG THIEME VERLAG KG,NA +european journal of pediatrics,0340-6199,1432-1076,NA,0,0,1,0,Pediatrics,NA,NA,SPRINGER,NA +european journal of personality,0890-2070,1099-0984,EJPBlog,0,1,0,1,NA,"Psychology, Social",NA,SAGE PUBLICATIONS LTD,2017-05-30 +european journal of pharmaceutical sciences,0928-0987,1879-0720,EditorsEJPS,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ELSEVIER,2020-08-26 +european journal of pharmaceutics and biopharmaceutics,0939-6411,1873-3441,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +european journal of pharmacology,0014-2999,1879-0712,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +european journal of philosophy,0966-8373,1468-0378,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +european journal of phycology,0967-0262,1469-4433,NA,0,0,1,0,Plant Sciences | Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +european journal of physical and rehabilitation medicine,1973-9087,1973-9095,NA,0,0,1,0,Rehabilitation,NA,NA,EDIZIONI MINERVA MEDICA,NA +european journal of physics,0143-0807,1361-6404,NA,0,0,1,0,"Education, Scientific Disciplines | Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +european journal of plant pathology,0929-1873,1573-8469,NA,0,0,1,0,Agronomy | Plant Sciences | Horticulture,NA,NA,SPRINGER,NA +european journal of political economy,0176-2680,1873-5703,NA,0,1,0,0,NA,Economics | Political Science,NA,ELSEVIER SCIENCE INC,NA +european journal of political research,0304-4130,1475-6765,ejprjournal,0,1,0,1,NA,Political Science,NA,WILEY,2010-04-22 +european journal of population-revue europeenne de demographie,0168-6577,1572-9885,NA,0,1,0,0,NA,Demography,NA,SPRINGER,NA +european journal of preventive cardiology,2047-4873,2047-4881,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,OXFORD UNIV PRESS,NA +european journal of protistology,0932-4739,1618-0429,NA,0,0,1,0,Microbiology,NA,NA,ELSEVIER GMBH,NA +european journal of psychiatry,0213-6163,0213-6163,NA,0,1,0,0,NA,Psychiatry,NA,ELSEVIER ESPANA SLU,NA +european journal of psychological assessment,1015-5759,2151-2426,EJPAjournal,0,1,0,1,NA,"Psychology, Applied",NA,HOGREFE PUBLISHING CORP,2019-10-07 +european journal of psychology applied to legal context,1889-1861,1989-4007,revistaejpalc,0,1,0,1,NA,"Law | Psychology, Multidisciplinary",NA,COLEGIO OFICIAL PSICOLOGOS MADRID,2018-07-27 +european journal of psychology of education,0256-2928,1878-5174,NA,0,1,0,0,NA,"Psychology, Educational",NA,SPRINGER,NA +european journal of psychology open,2673-8627,2673-8627,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,HOGREFE AG-HOGREFE AG SUISSE,NA +european journal of psychotraumatology,2000-8198,2000-8066,Psychotraumatol,0,1,0,1,NA,"Psychology, Clinical | Psychiatry",NA,TAYLOR & FRANCIS LTD,2011-07-21 +european journal of public health,1101-1262,1464-360X,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +european journal of public health,1101-1262,1464-360X,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +european journal of radiology,0720-048X,1872-7727,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER IRELAND LTD,NA +european journal of remote sensing,2279-7254,2279-7254,NA,0,0,1,0,Remote Sensing,NA,NA,TAYLOR & FRANCIS LTD,NA +european journal of scandinavian studies,2191-9399,2191-9402,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian | Language & Linguistics",WALTER DE GRUYTER GMBH,NA +european journal of social psychology,0046-2772,1099-0992,NA,0,1,0,0,NA,"Psychology, Social",NA,WILEY,NA +european journal of social theory,1368-4310,1461-7137,NA,0,1,0,0,NA,Sociology,NA,SAGE PUBLICATIONS LTD,NA +european journal of social work,1369-1457,1468-2664,NA,0,1,0,0,NA,Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal of soil biology,1164-5563,1778-3615,EJSOBI,0,0,1,1,Ecology | Soil Science,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,2020-05-14 +european journal of soil science,1351-0754,1365-2389,ejsoilscience,0,0,1,1,Soil Science,NA,NA,WILEY,2019-03-14 +european journal of special needs education,0885-6257,1469-591X,NA,0,1,0,0,NA,"Education, Special",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal of sport science,1746-1391,1536-7290,EurJSportSci,0,0,1,1,Sport Sciences,NA,NA,TAYLOR & FRANCIS LTD,2013-12-17 +european journal of taxonomy,2118-9773,2118-9773,ejtaxonomy,0,0,1,1,Plant Sciences | Entomology | Zoology,NA,NA,MUSEUM NATL HISTOIRE NATURELLE,2019-12-20 +european journal of teacher education,0261-9768,1469-5928,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal of the history of economic thought,0967-2567,1469-5936,NA,0,1,0,0,NA,Economics | History Of Social Sciences,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal of transport and infrastructure research,1567-7133,1567-7141,NA,0,1,0,0,NA,Transportation,NA,EDITORIAL BOARD EJTIR,NA +european journal of trauma and emergency surgery,1863-9933,1863-9941,NA,0,0,1,0,Emergency Medicine,NA,NA,SPRINGER HEIDELBERG,NA +european journal of vascular and endovascular surgery,1078-5884,1532-2165,EJVES_ESVS,0,0,1,1,Surgery | Peripheral Vascular Diseases,NA,NA,W B SAUNDERS CO LTD,2013-10-31 +european journal of wildlife research,1612-4642,1439-0574,ejwr_cm,0,0,1,1,Ecology | Zoology,NA,NA,SPRINGER,2020-04-15 +european journal of womens studies,1350-5068,1461-7420,NA,0,1,0,0,NA,Women'S Studies,NA,SAGE PUBLICATIONS LTD,NA +european journal of wood and wood products,0018-3768,1436-736X,NA,0,0,1,0,"Forestry | Materials Science, Paper & Wood",NA,NA,SPRINGER,NA +european journal of work and organizational psychology,1359-432X,1464-0643,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european journal on criminal policy and research,0928-1371,1572-9869,NA,0,1,0,0,NA,Criminology & Penology,NA,SPRINGER,NA +european law journal,1351-5993,1468-0386,eurlawj,0,1,0,1,NA,Law,NA,WILEY,2020-09-15 +european law review,0307-5400,0307-5400,NA,0,1,0,0,NA,Law,NA,SWEET MAXWELL LTD,NA +european legacy-toward new paradigms,1084-8770,1470-1316,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european management journal,0263-2373,1873-5681,EuropeanManage1,0,1,0,1,NA,Business | Management,NA,ELSEVIER SCI LTD,2020-10-13 +european management review,1740-4754,1740-4762,NA,0,1,0,0,NA,Management,NA,"WILEY PERIODICALS, INC",NA +european neurology,0014-3022,1421-9913,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,KARGER,NA +european neuropsychopharmacology,0924-977X,1873-7862,NA,0,0,1,0,Clinical Neurology | Neurosciences | Pharmacology & Pharmacy | Psychiatry,NA,NA,ELSEVIER,NA +european physical education review,1356-336X,1741-2749,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS LTD,NA +european physical journal-applied physics,1286-0042,1286-0050,NA,0,0,1,0,"Physics, Applied",NA,NA,EDP SCIENCES S A,NA +european physical journal-special topics,1951-6355,1951-6401,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +european physical journal a,1434-6001,1434-601X,NA,0,0,1,0,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,SPRINGER,NA +european physical journal b,1434-6028,1434-6036,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,SPRINGER,NA +european physical journal c,1434-6044,1434-6052,NA,0,0,1,0,"Physics, Particles & Fields",NA,NA,SPRINGER,NA +european physical journal d,1434-6060,1434-6079,NA,0,0,1,0,"Optics | Physics, Atomic, Molecular & Chemical",NA,NA,SPRINGER,NA +european physical journal e,1292-8941,1292-895X,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary | Physics, Applied | Polymer Science",NA,NA,SPRINGER,NA +european physical journal h,2102-6459,2102-6467,NA,0,0,1,0,"History & Philosophy Of Science | Physics, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +european physical journal plus,2190-5444,2190-5444,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +european planning studies,0965-4313,1469-5944,NA,0,1,0,0,NA,Environmental Studies | Geography | Regional & Urban Planning | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european political science,1680-4333,1682-0983,epsjournal,0,1,0,1,NA,Political Science,NA,PALGRAVE MACMILLAN LTD,2014-08-18 +european political science review,1755-7739,1755-7747,epsrjournal,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2010-03-04 +european polymer journal,0014-3057,1873-1945,EuropeanPolymer,0,0,1,1,Polymer Science,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2021-04-14 +european poultry science,1612-9199,1612-9199,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,EUGEN ULMER GMBH CO,NA +european psychiatry,0924-9338,1778-3585,EP_Editors,0,1,1,1,Psychiatry,Psychiatry,NA,CAMBRIDGE UNIV PRESS,2016-03-13 +european psychiatry,0924-9338,1778-3585,EP_Editors,0,1,1,1,Psychiatry,Psychiatry,NA,CAMBRIDGE UNIV PRESS,2016-03-13 +european psychologist,1016-9040,1878-531X,EurPsychol_jour,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,HOGREFE PUBLISHING CORP,2020-06-01 +european radiology,0938-7994,1432-1084,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +european research on management and business economics,2444-8834,2444-8842,NA,0,1,0,0,NA,Business | Economics | Management,NA,ELSEVIER SCI LTD,NA +european respiratory journal,0903-1936,1399-3003,NA,0,0,1,0,Respiratory System,NA,NA,EUROPEAN RESPIRATORY SOC JOURNALS LTD,NA +european respiratory review,0905-9180,1600-0617,NA,0,0,1,0,Respiratory System,NA,NA,EUROPEAN RESPIRATORY SOC JOURNALS LTD,NA +european review,1062-7987,1474-0575,NA,0,1,0,0,NA,Area Studies,NA,CAMBRIDGE UNIV PRESS,NA +european review for medical and pharmacological sciences,1128-3602,1128-3602,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,VERDUCI PUBLISHER,NA +european review of aging and physical activity,1813-7253,1861-6909,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,SPRINGER HEIDELBERG,NA +european review of agricultural economics,0165-1587,1464-3618,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,OXFORD UNIV PRESS,NA +european review of agricultural economics,0165-1587,1464-3618,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,OXFORD UNIV PRESS,NA +european review of applied psychology-revue europeenne de psychologie appliquee,1162-9088,1162-9088,NA,0,1,0,0,NA,"Psychology, Applied",NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +european review of economic history,1361-4916,1474-0044,NA,0,1,0,0,NA,Economics | History Of Social Sciences,NA,OXFORD UNIV PRESS,NA +european review of history-revue europeenne d histoire,1350-7486,1469-8293,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european review of social psychology,1046-3283,1479-277X,NA,0,1,0,0,NA,"Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european security,0966-2839,1746-1545,european_sec,0,1,0,1,NA,Area Studies | International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-01-04 +european societies,1461-6696,1469-8307,euro_societies,0,1,0,1,NA,Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +european sociological review,0266-7215,1468-2672,esr_news,0,1,0,1,NA,Sociology,NA,OXFORD UNIV PRESS,2013-10-23 +european spine journal,0940-6719,1432-0932,EurSpineJournal,0,0,1,1,Clinical Neurology | Orthopedics,NA,NA,SPRINGER,2015-08-26 +european sport management quarterly,1618-4742,1746-031X,EuroSportManQ,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-02-01 +european stroke journal,2396-9873,2396-9881,NA,0,0,1,0,Clinical Neurology | Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS LTD,NA +european surgery-acta chirurgica austriaca,1682-8631,1682-4016,SurgeryEuropean,0,0,1,1,Surgery,NA,NA,SPRINGER WIEN,2019-07-30 +european surgical research,0014-312X,1421-9921,NA,0,0,1,0,Surgery,NA,NA,KARGER,NA +european thyroid journal,2235-0640,2235-0802,Eur_Thyroid_J,0,0,1,1,Endocrinology & Metabolism,NA,NA,KARGER,2015-12-27 +european transport research review,1867-0717,1866-8887,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,SPRINGER,NA +european transport research review,1867-0717,1866-8887,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,SPRINGER,NA +european union politics,1465-1165,1741-2757,eup_thejournal,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS LTD,2019-01-09 +european urban and regional studies,0969-7764,1461-7145,eursjournal,0,1,0,1,NA,Environmental Studies | Regional & Urban Planning | Urban Studies,NA,SAGE PUBLICATIONS LTD,2018-02-08 +european urology,0302-2838,1873-7560,EUplatinum,0,0,1,1,Urology & Nephrology,NA,NA,ELSEVIER,2011-04-19 +european urology focus,2405-4569,2405-4569,EurUrolFocus,0,0,1,1,Urology & Nephrology,NA,NA,ELSEVIER,2014-02-25 +european urology oncology,2588-9311,2588-9311,EurUrolOncol,0,0,1,1,Oncology | Urology & Nephrology,NA,NA,ELSEVIER,2015-04-20 +european urology open science,2666-1691,2666-1683,EurUrolOpen,0,0,1,1,Urology & Nephrology,NA,NA,ELSEVIER,2019-12-23 +european zoological journal,2475-0263,2475-0263,NA,0,0,1,0,Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +europhysics letters,0295-5075,1286-4854,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +eurosurveillance,1025-496X,1560-7917,Eurosurveillanc,0,0,1,1,Infectious Diseases,NA,NA,EUR CENTRE DIS PREVENTION & CONTROL,2012-01-05 +evaluation,1356-3890,1461-7153,EvaluationJour1,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,2020-06-16 +evaluation & the health professions,0163-2787,1552-3918,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,SAGE PUBLICATIONS INC,NA +evaluation & the health professions,0163-2787,1552-3918,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,SAGE PUBLICATIONS INC,NA +evaluation and program planning,0149-7189,1873-7870,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +evaluation review,0193-841X,1552-3926,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +evidence-based complementary and alternative medicine,1741-427X,1741-4288,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,HINDAWI LTD,NA +evidence-based mental health,1362-0347,1468-960X,EBMentalHealth,0,0,1,1,Psychiatry,NA,NA,BMJ PUBLISHING GROUP,2010-05-13 +evidence & policy,1744-2648,1744-2656,EvidencePolicy,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,POLICY PRESS,2014-05-13 +evodevo,2041-9139,2041-9139,EvoDevo_BMC,0,0,1,1,Evolutionary Biology | Developmental Biology,NA,NA,BMC,2020-05-20 +evolution,0014-3820,1558-5646,journal_evo,0,0,1,1,Ecology | Evolutionary Biology | Genetics & Heredity,NA,NA,WILEY,2016-10-12 +evolution & development,1520-541X,1525-142X,NA,0,0,1,0,Evolutionary Biology | Developmental Biology | Genetics & Heredity,NA,NA,WILEY,NA +evolution and human behavior,1090-5138,1879-0607,EvolHumBehav,0,1,1,1,Behavioral Sciences,"Psychology, Biological | Social Sciences, Biomedical",NA,ELSEVIER SCIENCE INC,2016-06-29 +evolution and human behavior,1090-5138,1879-0607,EvolHumBehav,0,1,1,1,Behavioral Sciences,"Psychology, Biological | Social Sciences, Biomedical",NA,ELSEVIER SCIENCE INC,2016-06-29 +evolution equations and control theory,2163-2480,2163-2480,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +evolution letters,2056-3744,2056-3744,EvolLetters,0,0,1,1,Evolutionary Biology,NA,NA,JOHN WILEY & SONS LTD,2016-09-06 +evolution medicine and public health,2050-6201,2050-6201,NA,0,0,1,0,"Evolutionary Biology | Public, Environmental & Occupational Health",NA,NA,OXFORD UNIV PRESS,NA +evolution psychiatrique,0014-3855,1769-6674,LEvoPsych,0,1,0,1,NA,Psychiatry,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,2019-01-23 +evolutionary anthropology,1060-1538,1520-6505,evanthro,0,1,0,1,NA,Anthropology,NA,WILEY,2017-10-24 +evolutionary applications,1752-4571,1752-4571,EvolAppJournal,0,0,1,1,Evolutionary Biology,NA,NA,WILEY,2020-07-25 +evolutionary bioinformatics,1176-9343,1176-9343,EvoBioinfo,0,0,1,1,Evolutionary Biology | Mathematical & Computational Biology,NA,NA,SAGE PUBLICATIONS LTD,2019-01-10 +evolutionary biology,0071-3260,1934-2845,NA,0,0,1,0,Evolutionary Biology,NA,NA,SPRINGER,NA +evolutionary computation,1063-6560,1530-9304,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,MIT PRESS,NA +evolutionary ecology,0269-7653,1573-8477,evoecology,0,0,1,1,Ecology | Evolutionary Biology | Genetics & Heredity,NA,NA,SPRINGER,2018-06-26 +evolutionary ecology research,1522-0613,1937-3791,NA,0,0,1,0,Ecology | Evolutionary Biology | Genetics & Heredity,NA,NA,EVOLUTIONARY ECOLOGY LTD,NA +evolutionary psychology,1474-7049,1474-7049,NA,0,1,0,0,NA,"Psychology, Experimental",NA,SAGE PUBLICATIONS INC,NA +evolving systems,1868-6478,1868-6486,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER HEIDELBERG,NA +exceptional children,0014-4029,2163-5560,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SAGE PUBLICATIONS INC,NA +exceptionality,0936-2835,1532-7035,NA,0,1,0,0,NA,"Education, Special",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +exchange-journal of contemporary christianities in context,0166-2740,1572-543X,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +excli journal,1611-2156,1611-2156,EXCLIJournal,0,0,1,1,Biology,NA,NA,EXCLI JOURNAL MANAGING OFFICE,2020-03-10 +exemplaria-medieval early modern theory,1041-2573,1753-3074,readexemplaria,1,0,0,1,NA,NA,Medieval & Renaissance Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2010-03-24 +exercise and sport sciences reviews,0091-6331,1538-3008,ESSRonline,0,0,1,1,Physiology | Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-29 +exercise immunology review,1077-5552,1077-5552,NA,0,0,1,0,Immunology | Sport Sciences,NA,NA,W W F VERLAGSGESELLSCHAFT GMBH,NA +experimental aging research,0361-073X,1096-4657,NA,0,0,1,0,Geriatrics & Gerontology | Psychology,NA,NA,TAYLOR & FRANCIS INC,NA +experimental agriculture,0014-4797,1469-4441,NA,0,0,1,0,Agronomy,NA,NA,CAMBRIDGE UNIV PRESS,NA +experimental and applied acarology,0168-8162,1572-9702,NA,0,0,1,0,Entomology,NA,NA,SPRINGER,NA +experimental and clinical endocrinology & diabetes,0947-7349,1439-3646,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,GEORG THIEME VERLAG KG,NA +experimental and clinical psychopharmacology,1064-1297,1936-2293,NA,0,1,1,0,Pharmacology & Pharmacy | Psychiatry,"Psychology, Biological | Psychology, Clinical",NA,AMER PSYCHOLOGICAL ASSOC,NA +experimental and clinical psychopharmacology,1064-1297,1936-2293,NA,0,1,1,0,Pharmacology & Pharmacy | Psychiatry,"Psychology, Biological | Psychology, Clinical",NA,AMER PSYCHOLOGICAL ASSOC,NA +experimental and clinical transplantation,1304-0855,2146-8427,NA,0,0,1,0,Transplantation,NA,NA,BASKENT UNIV,NA +experimental and molecular medicine,1226-3613,2092-6413,NA,0,0,1,0,"Biochemistry & Molecular Biology | Medicine, Research & Experimental",NA,NA,SPRINGERNATURE,NA +experimental and molecular pathology,0014-4800,1096-0945,NA,0,0,1,0,Pathology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +experimental and therapeutic medicine,1792-0981,1792-1015,EtMedicine,0,0,1,1,"Medicine, Research & Experimental",NA,NA,SPANDIDOS PUBL LTD,2018-05-24 +experimental animals,1341-1357,1881-7122,NA,0,0,1,0,Veterinary Sciences | Zoology,NA,NA,INT PRESS EDITING CENTRE INC,NA +experimental astronomy,0922-6435,1572-9508,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,SPRINGER,NA +experimental biology and medicine,1535-3702,1535-3699,EBM_LatinAm,0,0,1,1,"Medicine, Research & Experimental",NA,NA,SAGE PUBLICATIONS LTD,2019-02-24 +experimental brain research,0014-4819,1432-1106,ExpBrainRes,0,0,1,1,Neurosciences,NA,NA,SPRINGER,2019-04-01 +experimental cell research,0014-4827,1090-2422,NA,0,0,1,0,Oncology | Cell Biology,NA,NA,ELSEVIER INC,NA +experimental dermatology,0906-6705,1600-0625,ExpDermatol,0,0,1,1,Dermatology,NA,NA,WILEY,2016-11-24 +experimental economics,1386-4157,1573-6938,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +experimental eye research,0014-4835,1096-0007,NA,0,0,1,0,Ophthalmology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +experimental gerontology,0531-5565,1873-6815,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +experimental heat transfer,0891-6152,1521-0480,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,TAYLOR & FRANCIS INC,NA +experimental hematology,0301-472X,1873-2399,NA,0,0,1,0,"Hematology | Medicine, Research & Experimental",NA,NA,ELSEVIER SCIENCE INC,NA +experimental hematology & oncology,2162-3619,2162-3619,NA,0,0,1,0,Oncology | Hematology,NA,NA,BMC,NA +experimental lung research,0190-2148,1521-0499,NA,0,0,1,0,Respiratory System,NA,NA,TAYLOR & FRANCIS INC,NA +experimental mathematics,1058-6458,1944-950X,NA,0,0,1,0,Mathematics,NA,NA,TAYLOR & FRANCIS INC,NA +experimental mechanics,0014-4851,1741-2765,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics | Materials Science, Characterization, Testing",NA,NA,SPRINGER,NA +experimental neurobiology,1226-2560,2093-8144,NA,0,0,1,0,"Medicine, Research & Experimental | Neurosciences",NA,NA,"KOREAN SOC BRAIN & NEURAL SCIENCE, KOREAN SOC NEURODEGENERATIVE DISEASE",NA +experimental neurology,0014-4886,1090-2430,NA,0,0,1,0,Neurosciences,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +experimental parasitology,0014-4894,1090-2449,NA,0,0,1,0,Parasitology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +experimental physiology,0958-0670,1469-445X,ExpPhysiol,0,0,1,1,Physiology,NA,NA,WILEY,2010-11-24 +experimental psychology,1618-3169,2190-5142,ExpPsychJournal,0,1,0,1,NA,"Psychology, Experimental",NA,HOGREFE PUBLISHING CORP,2019-11-18 +experimental techniques,0732-8818,1747-1567,NA,0,0,1,0,"Engineering, Mechanical | Mechanics | Materials Science, Characterization, Testing",NA,NA,SPRINGER,NA +experimental thermal and fluid science,0894-1777,1879-2286,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical | Physics, Fluids & Plasmas",NA,NA,ELSEVIER SCIENCE INC,NA +experiments in fluids,0723-4864,1432-1114,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,SPRINGER,NA +expert opinion on biological therapy,1471-2598,1744-7682,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Medicine, Research & Experimental",NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on drug delivery,1742-5247,1744-7593,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on drug discovery,1746-0441,1746-045X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on drug discovery,1746-0441,1746-045X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on drug metabolism & toxicology,1742-5255,1744-7607,NA,0,0,1,0,Biochemistry & Molecular Biology | Pharmacology & Pharmacy | Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on drug safety,1474-0338,1744-764X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on emerging drugs,1472-8214,1744-7623,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on investigational drugs,1354-3784,1744-7658,EO_InvDrugs,0,0,1,1,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,2015-07-12 +expert opinion on investigational drugs,1354-3784,1744-7658,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on orphan drugs,2167-8707,2167-8707,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on pharmacotherapy,1465-6566,1744-7666,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on therapeutic patents,1354-3776,1744-7674,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,TAYLOR & FRANCIS LTD,NA +expert opinion on therapeutic targets,1472-8222,1744-7631,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of anti-infective therapy,1478-7210,1744-8336,NA,0,0,1,0,Infectious Diseases | Microbiology | Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of anticancer therapy,1473-7140,1744-8328,NA,0,0,1,0,Oncology,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of clinical immunology,1744-666X,1744-8409,NA,0,0,1,0,Immunology,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of clinical pharmacology,1751-2433,1751-2441,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of gastroenterology & hepatology,1747-4124,1747-4132,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of hematology,1747-4086,1747-4094,NA,0,0,1,0,Hematology,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of medical devices,1743-4440,1745-2422,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of molecular diagnostics,1473-7159,1744-8352,NA,0,0,1,0,Pathology,NA,NA,TAYLOR & FRANCIS AS,NA +expert review of neurotherapeutics,1473-7175,1744-8360,NA,0,0,1,0,Clinical Neurology | Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of pharmacoeconomics & outcomes research,1473-7167,1744-8379,NA,0,1,1,0,Health Care Sciences & Services | Pharmacology & Pharmacy,Health Policy & Services,NA,TAYLOR & FRANCIS LTD,NA +expert review of pharmacoeconomics & outcomes research,1473-7167,1744-8379,NA,0,1,1,0,Health Care Sciences & Services | Pharmacology & Pharmacy,Health Policy & Services,NA,TAYLOR & FRANCIS LTD,NA +expert review of proteomics,1478-9450,1744-8387,NA,0,0,1,0,Biochemical Research Methods,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of respiratory medicine,1747-6348,1747-6356,NA,0,0,1,0,Respiratory System,NA,NA,TAYLOR & FRANCIS LTD,NA +expert review of vaccines,1476-0584,1744-8395,NA,0,0,1,0,Immunology,NA,NA,TAYLOR & FRANCIS LTD,NA +expert reviews in molecular medicine,1462-3994,1462-3994,Journal_ERMM,0,0,1,1,"Biochemistry & Molecular Biology | Medicine, Research & Experimental",NA,NA,CAMBRIDGE UNIV PRESS,2021-04-16 +expert reviews in molecular medicine,1462-3994,1462-3994,Journal_ERMM,0,0,1,1,"Biochemistry & Molecular Biology | Medicine, Research & Experimental",NA,NA,CAMBRIDGE UNIV PRESS,2021-04-16 +expert systems,0266-4720,1468-0394,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,WILEY,NA +expert systems with applications,0957-4174,1873-6793,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic | Operations Research & Management Science",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +explicator,0014-4940,1939-926X,NA,1,0,0,0,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +exploration geophysics,0812-3985,1834-7533,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,TAYLOR & FRANCIS LTD,NA +explorations in economic history,0014-4983,1090-2457,NA,0,1,0,0,NA,Economics | History Of Social Sciences,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +explore-the journal of science and healing,1550-8307,1878-7541,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,ELSEVIER SCIENCE INC,NA +expositiones mathematicae,0723-0869,1878-0792,NA,0,0,1,0,Mathematics,NA,NA,ELSEVIER GMBH,NA +expository times,0014-5246,1745-5308,ExpositoryTimes,1,0,0,1,NA,NA,Religion,SAGE PUBLICATIONS LTD,2014-10-31 +exposure and health,2451-9766,2451-9685,NA,0,0,1,0,Water Resources,NA,NA,SPRINGER,NA +express polymer letters,1788-618X,1788-618X,NA,0,0,1,0,Polymer Science,NA,NA,BUDAPEST UNIV TECHNOL & ECON,NA +expressions maghrebines,1540-0085,2475-2401,NA,1,0,0,0,NA,NA,"Literature, Romance",FLORIDA STATE UNIV,NA +extractive industries and society-an international journal,2214-790X,2214-7918,NA,0,1,0,0,NA,Environmental Studies,NA,ELSEVIER SCI LTD,NA +extrapolation,0014-5483,2047-7708,ExtrapolationSF,1,0,0,1,NA,NA,Literature,LIVERPOOL UNIV PRESS,2017-02-20 +extreme mechanics letters,2352-4316,2352-4316,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics",NA,NA,ELSEVIER,NA +extremes,1386-1999,1572-915X,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,SPRINGER,NA +extremophiles,1431-0651,1433-4909,NA,0,0,1,0,Biochemistry & Molecular Biology | Microbiology,NA,NA,SPRINGER JAPAN KK,NA +eye,0950-222X,1476-5454,Eye_Journal,0,0,1,1,Ophthalmology,NA,NA,SPRINGERNATURE,2015-05-26 +eye & contact lens-science and clinical practice,1542-2321,1542-233X,NA,0,0,1,0,Ophthalmology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +eye and vision,2326-0254,2326-0254,NA,0,0,1,0,Ophthalmology,NA,NA,BMC,NA +fabula,0014-6242,1613-0464,NA,1,0,0,0,NA,NA,Folklore,WALTER DE GRUYTER GMBH,NA +facets,2371-1671,2371-1671,FACETSJournal,0,0,1,1,Multidisciplinary Sciences,NA,NA,CANADIAN SCIENCE PUBLISHING,2015-03-17 +facial plastic surgery,0736-6825,1098-8793,NA,0,0,1,0,Surgery,NA,NA,THIEME MEDICAL PUBL INC,NA +facial plastic surgery & aesthetic medicine,2689-3614,2689-3622,FPSAMjournal,0,0,1,1,Surgery,NA,NA,"MARY ANN LIEBERT, INC",2020-04-11 +facial plastic surgery clinics of north america,1064-7406,1558-1926,NA,0,0,1,0,Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +facies,0172-9179,1612-4820,NA,0,0,1,0,Geology | Paleontology,NA,NA,SPRINGER,NA +facta universitatis-series mechanical engineering,0354-2025,2335-0164,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,UNIV NIS,NA +familial cancer,1389-9600,1573-7292,NA,0,0,1,0,Oncology | Genetics & Heredity,NA,NA,SPRINGER,NA +families in society-the journal of contemporary social services,1044-3894,1945-1350,FISOnline,0,1,0,1,NA,Family Studies | Social Work,NA,SAGE PUBLICATIONS INC,2009-10-15 +families relationships and societies,2046-7435,2046-7443,FRSjournal,0,1,0,1,NA,Family Studies,NA,POLICY PRESS,2014-07-31 +families systems & health,1091-7527,1939-0602,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Family Studies",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +families systems & health,1091-7527,1939-0602,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Family Studies",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +family & community health,0160-6379,1550-5057,NA,0,1,0,0,NA,"Family Studies | Public, Environmental & Occupational Health",NA,LIPPINCOTT WILLIAMS & WILKINS,NA +family business review,0894-4865,1741-6248,NA,0,1,0,0,NA,Business,NA,SAGE PUBLICATIONS INC,NA +family law quarterly,0014-729X,2162-7991,NA,0,1,0,0,NA,Family Studies | Law,NA,"AMER BAR ASSOC, ADMINISTRATIVE LAW & REGULATORY PRACTICE SECTION",NA +family medicine,0742-3225,1938-3800,fammedjournal,0,0,1,1,"Primary Health Care | Medicine, General & Internal",NA,NA,SOC TEACHERS FAMILY MEDICINE,2018-08-30 +family practice,0263-2136,1460-2229,NA,0,0,1,0,"Primary Health Care | Medicine, General & Internal",NA,NA,OXFORD UNIV PRESS,NA +family process,0014-7370,1545-5300,FamilyProcess,0,1,0,1,NA,"Psychology, Clinical | Family Studies",NA,WILEY,2011-12-18 +family relations,0197-6664,1741-3729,NA,0,1,0,0,NA,Family Studies | Social Work,NA,WILEY,NA +faraday discussions,1359-6640,1364-5498,Faraday_D,0,0,1,1,"Chemistry, Physical",NA,NA,ROYAL SOC CHEMISTRY,2009-03-10 +farmacia,0014-8237,2065-0019,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SOC STIINTE FARMACEUTICE ROMANIA,NA +faseb journal,0892-6638,1530-6860,NA,0,0,1,0,Biochemistry & Molecular Biology | Biology | Cell Biology,NA,NA,WILEY,NA +fashion and textiles,2198-0802,2198-0802,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,SPRINGER,NA +fashion practice-the journal of design creative process & the fashion industry,1756-9370,1756-9389,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +fashion theory-the journal of dress body & culture,1362-704X,1751-7419,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +fatigue & fracture of engineering materials & structures,8756-758X,1460-2695,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,WILEY,NA +febs journal,1742-464X,1742-4658,FEBSJournal,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,WILEY,2010-11-24 +febs letters,0014-5793,1873-3468,FEBS_Letters,0,0,1,1,Biochemistry & Molecular Biology | Biophysics | Cell Biology,NA,NA,WILEY,2014-05-13 +febs open bio,2211-5463,2211-5463,FEBSOpenBio,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,WILEY,2012-03-13 +federal reserve bank of st louis review,0014-9187,2163-4505,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,FEDERAL RESERVE BANK ST LOUIS,NA +female pelvic medicine and reconstructive surgery,2151-8378,2154-4212,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +feminism & psychology,0959-3535,1461-7161,FemPsychJournal,0,1,0,1,NA,"Psychology, Multidisciplinary | Women'S Studies",NA,SAGE PUBLICATIONS LTD,2017-08-10 +feminist criminology,1557-0851,1557-086X,DWCFeminist,0,1,0,1,NA,Criminology & Penology,NA,SAGE PUBLICATIONS INC,2018-10-09 +feminist economics,1354-5701,1466-4372,FeministEcon,0,1,0,1,NA,Economics | Women'S Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-12-06 +feminist legal studies,0966-3622,1572-8455,fls_journal,0,1,0,1,NA,Law | Women'S Studies,NA,SPRINGER,2013-01-15 +feminist media studies,1468-0777,1471-5902,femmediastudies,0,1,0,1,NA,Communication | Women'S Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-03-27 +feminist review,0141-7789,1466-4380,FeministReview_,0,1,0,1,NA,Women'S Studies,NA,SAGE PUBLICATIONS LTD,2010-04-07 +feminist studies,0046-3663,2153-3873,feministstudies,0,1,0,1,NA,Women'S Studies,NA,FEMINIST STUD INC,2011-03-16 +feminist theology,0966-7350,1745-5189,NA,1,0,0,0,NA,NA,Religion,SAGE PUBLICATIONS LTD,NA +feminist theory,1464-7001,1741-2773,FeministTheory,0,1,0,1,NA,Women'S Studies,NA,SAGE PUBLICATIONS INC,2012-10-18 +feministische studien,0723-5186,2365-9920,fstudien,0,1,0,1,NA,Women'S Studies,NA,WALTER DE GRUYTER GMBH,2013-11-07 +fems microbiology ecology,0168-6496,1574-6941,NA,0,0,1,0,Microbiology,NA,NA,OXFORD UNIV PRESS,NA +fems microbiology letters,0378-1097,1574-6968,femsletters,0,0,1,1,Microbiology,NA,NA,OXFORD UNIV PRESS,2015-11-22 +fems microbiology reviews,0168-6445,1574-6976,NA,0,0,1,0,Microbiology,NA,NA,OXFORD UNIV PRESS,NA +fems yeast research,1567-1356,1567-1364,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology | Mycology,NA,NA,OXFORD UNIV PRESS,NA +fermentation-basel,2311-5637,2311-5637,Ferment_MDPI,0,0,1,1,Biotechnology & Applied Microbiology,NA,NA,MDPI,2017-03-31 +ferroelectrics,0015-0193,1563-5112,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,NA +ferroelectrics letters section,0731-5171,1563-5228,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,NA +fertility and sterility,0015-0282,1556-5653,NA,0,0,1,0,Obstetrics & Gynecology | Reproductive Biology,NA,NA,ELSEVIER SCIENCE INC,NA +fetal and pediatric pathology,1551-3815,1551-3823,NA,0,0,1,0,Pathology | Pediatrics,NA,NA,TAYLOR & FRANCIS INC,NA +fetal diagnosis and therapy,1015-3837,1421-9964,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,KARGER,NA +few-body systems,0177-7963,1432-5411,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SPRINGER WIEN,NA +ff communications,0014-5815,NA,NA,1,0,0,0,NA,NA,Folklore,SUOMALAINEN TIEDEAKATEMIA-ACADEMIA SCIENTIARUM FENNICA,NA +fiber and integrated optics,0146-8030,1096-4681,NA,0,0,1,0,Optics,NA,NA,TAYLOR & FRANCIS INC,NA +fibers and polymers,1229-9197,1875-0052,NA,0,0,1,0,"Materials Science, Textiles | Polymer Science",NA,NA,KOREAN FIBER SOC,NA +fibre chemistry,0015-0541,1573-8493,NA,0,0,1,0,"Chemistry, Multidisciplinary | Materials Science, Multidisciplinary | Materials Science, Textiles",NA,NA,SPRINGER,NA +fibres & textiles in eastern europe,1230-3666,1230-3666,FTEEJournal,0,0,1,1,"Materials Science, Textiles",NA,NA,INST CHEMICAL FIBRES,2020-10-29 +fiddlehead,0015-0630,0015-0630,TheFiddlehd,1,0,0,1,NA,NA,Literary Reviews,UNIV NEW BRUNSWICK,2015-01-12 +field crops research,0378-4290,1872-6852,NA,0,0,1,0,Agronomy,NA,NA,ELSEVIER,NA +field methods,1525-822X,1552-3969,NA,0,1,0,0,NA,"Anthropology | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +film-philosophy,1466-4615,1466-4615,filmphiljournal,1,0,0,1,NA,NA,"Philosophy | Film, Radio, Television",EDINBURGH UNIV PRESS,2010-09-07 +film comment,0015-119X,0015-119X,FilmComment,1,0,0,1,NA,NA,"Film, Radio, Television",FILM SOC LINCOLN CENTER,2009-05-03 +film criticism,0163-5069,0163-5069,NA,1,0,0,0,NA,NA,"Film, Radio, Television",FILM CRITICISM,NA +film quarterly,0015-1386,1533-8630,FilmQuarterly,1,0,0,1,NA,NA,"Film, Radio, Television",UNIV CALIFORNIA PRESS,2013-06-11 +filomat,0354-5180,0354-5180,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,"UNIV NIS, FAC SCI MATH",NA +filosofia unisinos,1519-5023,1984-8234,NA,1,0,0,0,NA,NA,Philosophy,UNIV DO VALE DO RIO DOS SINOS,NA +filosoficky casopis,0015-1831,2570-9232,NA,1,0,0,0,NA,NA,Philosophy,FILOSOFICKY CASOPIS INST PHILOSOPHY,NA +filosofija-sociologija,0235-7186,0235-7186,NA,1,1,0,0,NA,Sociology,Philosophy,LITHUANIAN ACAD SCIENCES,NA +filosofija-sociologija,0235-7186,0235-7186,NA,1,1,0,0,NA,Sociology,Philosophy,LITHUANIAN ACAD SCIENCES,NA +filozofia,0046-385X,2585-7061,NA,1,0,0,0,NA,NA,Philosophy,INST PHILOSOPHY SLOVAK ACAD SCIENCES & INST PHILOSOPHY CZECH ACAD SCIENCES,NA +filozofia nauki,1230-6894,2657-5868,NA,1,0,0,0,NA,NA,Philosophy,"WARSAW UNIV, INST PHILOSOPHY",NA +filozofska istrazivanja,0351-4706,0351-4706,NA,1,0,0,0,NA,NA,Philosophy,CROATIAN PHILOSOPHICAL SOC,NA +filozofski vestnik,0353-4510,1581-1239,NA,1,0,0,0,NA,NA,Philosophy,ZRC PUBLISHING,NA +filtration & separation,0015-1882,1873-7218,NA,0,0,1,0,"Engineering, Chemical",NA,NA,ELSEVIER ADVANCED TECHNOLOGY,NA +finance a uver-czech journal of economics and finance,0015-1920,0015-1920,NA,0,1,0,0,NA,"Business, Finance",NA,CHARLES UNIV-PRAGUE,NA +finance and stochastics,0949-2984,1432-1122,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Business, Finance | Social Sciences, Mathematical Methods",NA,SPRINGER HEIDELBERG,NA +finance and stochastics,0949-2984,1432-1122,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Business, Finance | Social Sciences, Mathematical Methods",NA,SPRINGER HEIDELBERG,NA +finance research letters,1544-6123,1544-6131,NA,0,1,0,0,NA,"Business, Finance",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +financial analysts journal,0015-198X,1938-3312,NA,0,1,0,0,NA,"Business, Finance",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +financial innovation,2199-4730,2199-4730,NA,0,1,0,0,NA,"Business, Finance | Social Sciences, Mathematical Methods",NA,SPRINGER,NA +financial management,0046-3892,1755-053X,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +finanzarchiv,0015-2218,1614-0974,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,MOHR SIEBECK,NA +finite elements in analysis and design,0168-874X,1872-6925,NA,0,0,1,0,"Mathematics, Applied | Mechanics",NA,NA,ELSEVIER,NA +finite fields and their applications,1071-5797,1090-2465,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +fire-switzerland,2571-6255,2571-6255,Fire_MDPI,0,0,1,1,Forestry | Ecology,NA,NA,MDPI,2018-01-18 +fire and materials,0308-0501,1099-1018,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,WILEY,NA +fire ecology,1933-9747,1933-9747,NA,0,0,1,0,Ecology | Forestry,NA,NA,SPRINGER,NA +fire safety journal,0379-7112,1873-7226,NA,0,0,1,0,"Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +fire technology,0015-2684,1572-8099,FireTechnology,0,0,1,1,"Engineering, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,SPRINGER,2013-01-08 +first language,0142-7237,1740-2344,NA,1,1,0,0,NA,"Psychology, Development | Linguistics",Language & Linguistics,SAGE PUBLICATIONS LTD,NA +first language,0142-7237,1740-2344,NA,1,1,0,0,NA,"Psychology, Development | Linguistics",Language & Linguistics,SAGE PUBLICATIONS LTD,NA +fiscal studies,0143-5671,1475-5890,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,WILEY,NA +fish & shellfish immunology,1050-4648,1095-9947,NA,0,0,1,0,Fisheries | Immunology | Marine & Freshwater Biology | Veterinary Sciences,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +fish and fisheries,1467-2960,1467-2979,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +fish pathology,0388-788X,1881-7335,NA,0,0,1,0,Fisheries | Veterinary Sciences,NA,NA,JAPAN SOC FISH PATHOL DEPT FISHERIES-FAC AGR,NA +fish physiology and biochemistry,0920-1742,1573-5168,NA,0,0,1,0,Biochemistry & Molecular Biology | Fisheries | Physiology,NA,NA,SPRINGER,NA +fisheries,0363-2415,1548-8446,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +fisheries management and ecology,0969-997X,1365-2400,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +fisheries oceanography,1054-6006,1365-2419,NA,0,0,1,0,Fisheries | Oceanography,NA,NA,WILEY,NA +fisheries research,0165-7836,1872-6763,NA,0,0,1,0,Fisheries,NA,NA,ELSEVIER,NA +fisheries science,0919-9268,1444-2906,NA,0,0,1,0,Fisheries,NA,NA,SPRINGER JAPAN KK,NA +fishery bulletin,0090-0656,1937-4518,NA,0,0,1,0,Fisheries,NA,NA,"NATL MARINE FISHERIES SERVICE SCIENTIFIC PUBL OFFICE",NA +fishes,2410-3888,2410-3888,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,MDPI,NA +fitoterapia,0367-326X,1873-6971,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,ELSEVIER,NA +fixed point theory,1583-5022,2066-9208,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,HOUSE BOOK SCIENCE-CASA CARTII STIINTA,NA +flatchem,2452-2627,2452-2627,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +flavour and fragrance journal,0882-5734,1099-1026,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,WILEY,NA +fleischwirtschaft,0015-363X,NA,FleiwiNews,0,0,1,1,Food Science & Technology,NA,NA,DEUTSCHER FACHVERLAG GMBH,2009-10-30 +flexible and printed electronics,2058-8585,2058-8585,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +flexible services and manufacturing journal,1936-6582,1936-6590,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing | Operations Research & Management Science",NA,NA,SPRINGER,NA +flora,0367-2530,1618-0585,NA,0,0,1,0,Plant Sciences | Ecology,NA,NA,ELSEVIER GMBH,NA +florida entomologist,0015-4040,1938-5102,NA,0,0,1,0,Entomology,NA,NA,FLORIDA ENTOMOLOGICAL SOC,NA +flow measurement and instrumentation,0955-5986,1873-6998,NA,0,0,1,0,"Engineering, Mechanical | Instruments & Instrumentation",NA,NA,ELSEVIER SCI LTD,NA +flow turbulence and combustion,1386-6184,1573-1987,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,SPRINGER,NA +fluctuation and noise letters,0219-4775,1793-6780,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Physics, Applied",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +fluid dynamics,0015-4628,1573-8507,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +fluid dynamics research,0169-5983,1873-7005,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,IOP PUBLISHING LTD,NA +fluid phase equilibria,0378-3812,1879-0224,NA,0,0,1,0,"Thermodynamics | Chemistry, Physical | Engineering, Chemical",NA,NA,ELSEVIER,NA +fluids and barriers of the cns,2045-8118,2045-8118,NA,0,0,1,0,Neurosciences,NA,NA,BMC,NA +fluoride,0015-4725,2253-4083,NA,0,0,1,0,"Public, Environmental & Occupational Health | Toxicology",NA,NA,INT SOC FLUORIDE RESEARCH,NA +fly,1933-6934,1933-6942,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,TAYLOR & FRANCIS INC,NA +focaal-journal of global and historical anthropology,0920-1297,1558-5263,NA,0,1,0,0,NA,Anthropology,NA,BERGHAHN JOURNALS,NA +focus on autism and other developmental disabilities,1088-3576,1538-4829,NA,0,1,0,0,NA,"Education, Special | Psychology, Development | Rehabilitation",NA,SAGE PUBLICATIONS INC,NA +folia biologica,0015-5500,0015-5500,NA,0,0,1,0,Biology | Oncology,NA,NA,"CHARLES UNIV PRAGUE, FIRST FACULTY MEDICINE",NA +folia biologica-krakow,0015-5497,1734-9168,NA,0,0,1,0,Biology,NA,NA,"POLISH ACAD SCIENCES, INST SYSTEMATICS EVOLUTION ANIMALS",NA +folia geobotanica,1211-9520,1874-9348,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +folia histochemica et cytobiologica,0239-8508,1897-5631,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,VIA MEDICA,NA +folia horticulturae,0867-1761,2083-5965,NA,0,0,1,0,Horticulture,NA,NA,SCIENDO,NA +folia linguistica,0165-4004,1614-7308,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +folia linguistica,0165-4004,1614-7308,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +folia microbiologica,0015-5632,1874-9356,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,SPRINGER,NA +folia morphologica,0015-5659,1644-3284,NA,0,0,1,0,Anatomy & Morphology,NA,NA,VIA MEDICA,NA +folia neuropathologica,1641-4640,1509-572X,NA,0,0,1,0,Neurosciences | Pathology,NA,NA,TERMEDIA PUBLISHING HOUSE LTD,NA +folia parasitologica,0015-5683,1803-6465,NA,0,0,1,0,Parasitology,NA,NA,FOLIA PARASITOLOGICA,NA +folia phoniatrica et logopaedica,1021-7762,1421-9972,NA,0,1,1,0,Audiology & Speech-Language Pathology | Otorhinolaryngology | Rehabilitation,Rehabilitation,NA,KARGER,NA +folia phoniatrica et logopaedica,1021-7762,1421-9972,NA,0,1,1,0,Audiology & Speech-Language Pathology | Otorhinolaryngology | Rehabilitation,Rehabilitation,NA,KARGER,NA +folia primatologica,0015-5713,1421-9980,FoliaPrimatol,0,0,1,1,Zoology,NA,NA,KARGER,2016-02-10 +folk life-journal of ethnological studies,0430-8778,1759-670X,NA,1,0,0,0,NA,NA,Folklore,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +folk music journal,0531-9684,NA,NA,1,0,0,0,NA,NA,Folklore | Music,ENGLISH FOLK DANCE SONG SOC.,NA +folklore,0015-587X,1469-8315,NA,1,0,0,0,NA,NA,Folklore,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +folklore-electronic journal of folklore,1406-0957,1406-0949,NA,1,0,0,0,NA,NA,Folklore,ESTONIAN LITERARY MUSEUM,NA +fontes artis musicae,0015-6191,2471-156X,NA,1,0,0,0,NA,NA,Music,A-R EDITIONS,NA +food & function,2042-6496,2042-650X,FoodRSC,0,0,1,1,Biochemistry & Molecular Biology | Food Science & Technology,NA,NA,ROYAL SOC CHEMISTRY,2017-12-14 +food & nutrition research,1654-6628,1654-661X,FoodnNutrResear,0,0,1,1,Food Science & Technology | Nutrition & Dietetics,NA,NA,SWEDISH NUTRITION FOUNDATION-SNF,2009-08-31 +food additives & contaminants part b-surveillance,1939-3210,1939-3229,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology | Toxicology",NA,NA,TAYLOR & FRANCIS LTD,NA +food additives and contaminants part a-chemistry analysis control exposure & risk assessment,1944-0049,1944-0057,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology | Toxicology",NA,NA,TAYLOR & FRANCIS LTD,NA +food analytical methods,1936-9751,1936-976X,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER,NA +food and agricultural immunology,0954-0105,1465-3443,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology | Immunology | Toxicology",NA,NA,TAYLOR & FRANCIS LTD,NA +food and bioprocess technology,1935-5130,1935-5149,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER,NA +food and bioproducts processing,0960-3085,1744-3571,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Engineering, Chemical | Food Science & Technology",NA,NA,ELSEVIER,NA +food and chemical toxicology,0278-6915,1873-6351,NA,0,0,1,0,Food Science & Technology | Toxicology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +food and drug law journal,1064-590X,NA,NA,0,1,1,0,Food Science & Technology | Nutrition & Dietetics | Pharmacology & Pharmacy,Law,NA,FOOD DRUG LAW INST,NA +food and drug law journal,1064-590X,NA,NA,0,1,1,0,Food Science & Technology | Nutrition & Dietetics | Pharmacology & Pharmacy,Law,NA,FOOD DRUG LAW INST,NA +food and energy security,2048-3694,2048-3694,FoodEnergySec,0,0,1,1,Food Science & Technology,NA,NA,WILEY,2019-05-21 +food and environmental virology,1867-0334,1867-0342,NA,0,0,1,0,Environmental Sciences | Food Science & Technology | Microbiology | Virology,NA,NA,SPRINGER,NA +food and nutrition bulletin,0379-5721,1564-8265,FNBjournal,0,0,1,1,Food Science & Technology | Nutrition & Dietetics,NA,NA,SAGE PUBLICATIONS INC,2018-02-11 +food biophysics,1557-1858,1557-1866,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER,NA +food bioscience,2212-4292,2212-4306,FoodBioscience,0,0,1,1,Food Science & Technology,NA,NA,ELSEVIER,2021-12-28 +food biotechnology,0890-5436,1532-4249,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology,NA,NA,TAYLOR & FRANCIS INC,NA +food chemistry,0308-8146,1873-7072,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology | Nutrition & Dietetics",NA,NA,ELSEVIER SCI LTD,NA +food chemistry-x,2590-1575,2590-1575,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,ELSEVIER,NA +food control,0956-7135,1873-7129,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER SCI LTD,NA +food culture & society,1552-8014,1751-7443,FCSJournal,0,1,0,1,NA,Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-08-16 +food engineering reviews,1866-7910,1866-7929,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER,NA +food hydrocolloids,0268-005X,1873-7137,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,ELSEVIER SCI LTD,NA +food hygiene and safety science,0015-6426,1882-1006,NA,0,0,1,0,Food Science & Technology,NA,NA,FOOD HYGIENE & SAFETY,NA +food microbiology,0740-0020,1095-9998,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology | Microbiology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +food packaging and shelf life,2214-2894,2214-2894,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER,NA +food policy,0306-9192,1873-5657,_Food_Policy,0,1,1,1,Agricultural Economics & Policy | Food Science & Technology | Nutrition & Dietetics,Economics,NA,ELSEVIER SCI LTD,2020-06-26 +food policy,0306-9192,1873-5657,_Food_Policy,0,1,1,1,Agricultural Economics & Policy | Food Science & Technology | Nutrition & Dietetics,Economics,NA,ELSEVIER SCI LTD,2020-06-26 +food quality and preference,0950-3293,1873-6343,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER SCI LTD,NA +food quality and safety,2399-1399,2399-1402,FQSmag,0,0,1,1,Food Science & Technology,NA,NA,OXFORD UNIV PRESS,2015-09-08 +food research international,0963-9969,1873-7145,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER,NA +food reviews international,8755-9129,1525-6103,NA,0,0,1,0,Food Science & Technology | Nutrition & Dietetics,NA,NA,TAYLOR & FRANCIS INC,NA +food science & nutrition,2048-7177,2048-7177,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +food science and biotechnology,1226-7708,2092-6456,NA,0,0,1,0,Food Science & Technology,NA,NA,KOREAN SOCIETY FOOD SCIENCE & TECHNOLOGY-KOSFOST,NA +food science and human wellness,2213-4530,2213-4530,NA,0,0,1,0,Food Science & Technology | Nutrition & Dietetics,NA,NA,KEAI PUBLISHING LTD,NA +food science and technology,0101-2061,1678-457X,NA,0,0,1,0,Food Science & Technology,NA,NA,SOC BRASILEIRA CIENCIA TECNOLOGIA ALIMENTOS,NA +food science and technology international,1082-0132,1532-1738,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,SAGE PUBLICATIONS LTD,NA +food science and technology research,1344-6606,1881-3984,NA,0,0,1,0,Food Science & Technology,NA,NA,JAPANESE SOC FOOD SCI & TECHNOLOGY,NA +food science of animal resources,2636-0772,2636-0780,fsarjournal,0,0,1,1,Food Science & Technology,NA,NA,KOREAN SOC FOOD SCIENCE ANIMAL RESOURCES,2019-07-23 +food security,1876-4517,1876-4525,Food_Security,0,0,1,1,Food Science & Technology,NA,NA,SPRINGER,2009-07-13 +food structure-netherlands,2213-3291,2213-3291,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER,NA +food technology,0015-6639,0015-6639,NA,0,0,1,0,Food Science & Technology,NA,NA,INST FOOD TECHNOLOGISTS,NA +food technology and biotechnology,1330-9862,1334-2606,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology,NA,NA,FACULTY FOOD TECHNOLOGY BIOTECHNOLOGY,NA +food webs,2352-2496,2352-2496,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,ELSEVIER,NA +foodborne pathogens and disease,1535-3141,1556-7125,NA,0,0,1,0,Food Science & Technology,NA,NA,"MARY ANN LIEBERT, INC",NA +foods,2304-8158,2304-8158,NA,0,0,1,0,Food Science & Technology,NA,NA,MDPI,NA +foot & ankle international,1071-1007,1944-7876,NA,0,0,1,0,Orthopedics,NA,NA,SAGE PUBLICATIONS INC,NA +foot and ankle clinics,1083-7515,1558-1934,NA,0,0,1,0,Orthopedics,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +foot and ankle surgery,1268-7731,1460-9584,NA,0,0,1,0,Orthopedics,NA,NA,ELSEVIER,NA +forbes,0015-6914,0015-6914,Forbes,0,1,0,1,NA,"Business, Finance",NA,FORBES INC,2009-11-21 +fordham law review,0015-704X,0015-704X,fordhamlrev,0,1,0,1,NA,Law,NA,"FORDHAM UNIV, SCHOOL LAW",2010-12-01 +foreign affairs,0015-7120,NA,foreignaffairs,0,1,0,1,NA,International Relations,NA,COUNCIL FOREIGN RELAT IONS INC,2009-02-17 +foreign language annals,0015-718X,1944-9720,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,WILEY,NA +foreign policy analysis,1743-8586,1743-8594,fpa_jrnl,0,1,0,1,NA,International Relations,NA,OXFORD UNIV PRESS,2016-01-05 +forensic chemistry,2468-1709,2468-1709,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,ELSEVIER,NA +forensic science international,0379-0738,1872-6283,NA,0,0,1,0,"Medicine, Legal",NA,NA,ELSEVIER IRELAND LTD,NA +forensic science international-digital investigation,NA,2666-2817,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Information Systems",NA,NA,ELSEVIER SCI LTD,NA +forensic science international-genetics,1872-4973,1878-0326,NA,0,0,1,0,"Genetics & Heredity | Medicine, Legal",NA,NA,ELSEVIER IRELAND LTD,NA +forensic science medicine and pathology,1547-769X,1556-2891,NA,0,0,1,0,"Medicine, Legal | Pathology",NA,NA,HUMANA PRESS INC,NA +forensic toxicology,1860-8965,1860-8973,NA,0,0,1,0,Toxicology,NA,NA,SPRINGER,NA +forest ecology and management,0378-1127,1872-7042,NA,0,0,1,0,Forestry,NA,NA,ELSEVIER,NA +forest ecosystems,2095-6355,2197-5620,NA,0,0,1,0,Forestry,NA,NA,SPRINGER,NA +forest pathology,1437-4781,1439-0329,NA,0,0,1,0,Forestry,NA,NA,WILEY,NA +forest policy and economics,1389-9341,1872-7050,NA,0,1,1,0,Forestry,Economics | Environmental Studies,NA,ELSEVIER,NA +forest policy and economics,1389-9341,1872-7050,NA,0,1,1,0,Forestry,Economics | Environmental Studies,NA,ELSEVIER,NA +forest products journal,0015-7473,0015-7473,NA,0,0,1,0,"Forestry | Materials Science, Paper & Wood",NA,NA,FOREST PRODUCTS SOC,NA +forest science,0015-749X,1938-3738,NA,0,0,1,0,Forestry,NA,NA,OXFORD UNIV PRESS INC,NA +forest systems,2171-5068,2171-9845,ForestSystems_J,0,0,1,1,Forestry,NA,NA,INST NACIONAL INVESTIGACION & TECNOLOGIA AGRARIA & ALIMENTARIA-INIA-CSIC,2016-04-08 +forestry,0015-752X,1464-3626,NA,0,0,1,0,Forestry,NA,NA,OXFORD UNIV PRESS,NA +forestry chronicle,0015-7546,1499-9315,TFCJournal,0,0,1,1,Forestry,NA,NA,CANADIAN INST FORESTRY,2021-06-02 +forests,1999-4907,1999-4907,Forests_MDPI,0,0,1,1,Forestry,NA,NA,MDPI,2015-08-01 +forktail,0950-1746,0950-1746,NA,0,0,1,0,Ornithology,NA,NA,ORIENTAL BIRD CLUB,NA +formal aspects of computing,0934-5043,1433-299X,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,SPRINGER,NA +formal methods in system design,0925-9856,1572-8102,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +fornvannen-journal of swedish antiquarian research,0015-7813,1404-9430,Fornvannen_Jrnl,1,0,0,1,NA,NA,History | Archaeology,"ROYAL ACADEMY LETTERS, HISTORY & ANTIQUITIES",2020-04-05 +forschung im ingenieurwesen-engineering research,0015-7899,1434-0860,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Mechanical",NA,NA,SPRINGER HEIDELBERG,NA +fortschritte der neurologie psychiatrie,0720-4299,1439-3522,NA,0,0,1,0,Clinical Neurology | Psychiatry,NA,NA,GEORG THIEME VERLAG KG,NA +fortschritte der physik-progress of physics,0015-8208,1521-3978,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +forum-a journal of applied research in contemporary politics,2194-6183,1540-8884,TheForumJournal,0,1,0,1,NA,Political Science,NA,WALTER DE GRUYTER GMBH,2020-05-20 +forum der psychoanalyse,0178-7667,1437-0751,NA,0,1,0,0,NA,"Psychology, Psychoanalysis",NA,SPRINGER,NA +forum for modern language studies,0015-8518,1471-6860,FmlSjournal,1,0,0,1,NA,NA,Literature | Language & Linguistics,OXFORD UNIV PRESS,2021-06-11 +forum italicum,0014-5858,2168-989X,NA,1,0,0,0,NA,NA,"Language & Linguistics | Literature, Romance",SAGE PUBLICATIONS INC,NA +forum mathematicum,0933-7741,1435-5337,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WALTER DE GRUYTER GMBH,NA +forum modernes theater,0930-5874,NA,NA,1,0,0,0,NA,NA,Theater,GUNTER NARR VERLAG,NA +forum of mathematics pi,2050-5086,2050-5086,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,CAMBRIDGE UNIV PRESS,NA +forum of mathematics sigma,2050-5094,2050-5094,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,CAMBRIDGE UNIV PRESS,NA +fossil record,2193-0066,1860-1014,NA,0,0,1,0,Paleontology,NA,NA,COPERNICUS GESELLSCHAFT MBH,NA +fottea,1802-5439,1805-4927,NA,0,0,1,0,Plant Sciences,NA,NA,CZECH PHYCOLOGICAL SOC,NA +foundations and trends in information retrieval,1554-0669,1554-0677,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,NOW PUBLISHERS INC,NA +foundations of chemistry,1386-4238,1572-8463,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SPRINGER,NA +foundations of chemistry,1386-4238,1572-8463,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SPRINGER,NA +foundations of computational mathematics,1615-3375,1615-3383,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied | Mathematics",NA,NA,SPRINGER,NA +foundations of physics,0015-9018,1572-9516,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SPRINGER,NA +foundations of science,1233-1821,1572-8471,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SPRINGER,NA +foundations of science,1233-1821,1572-8471,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SPRINGER,NA +fourrages,0429-2766,0429-2766,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,ASSOC FRANCAISE PRODUCTION FOURRAGERE,NA +fractal and fractional,2504-3110,2504-3110,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications",NA,NA,MDPI,NA +fractals-complex geometry patterns and scaling in nature and society,0218-348X,1793-6543,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Multidisciplinary Sciences",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +fractional calculus and applied analysis,1311-0454,1314-2224,NA,0,0,1,0,"Mathematics, Applied | Mathematics, Interdisciplinary Applications | Mathematics",NA,NA,WALTER DE GRUYTER GMBH,NA +francais moderne,0015-9409,NA,NA,1,0,0,0,NA,NA,Language & Linguistics,CONSEIL INT LANGUE FRANCAISE,NA +free radical biology and medicine,0891-5849,1873-4596,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,ELSEVIER SCIENCE INC,NA +free radical research,1071-5762,1029-2470,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +french cultural studies,0957-1558,1740-2352,FrCulturalSt,1,1,0,1,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS INC,2019-07-12 +french cultural studies,0957-1558,1740-2352,FrCulturalSt,1,1,0,1,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS INC,2019-07-12 +french forum,0098-9355,1534-1836,NA,1,0,0,0,NA,NA,"Literature, Romance","UNIV PENNSYLVANIA, DEPT ROMANCE LANGUAGES",NA +french historical studies,0016-1071,1527-5493,NA,1,0,0,0,NA,NA,History,DUKE UNIV PRESS,NA +french history,0269-1191,1477-4542,NA,1,1,0,0,NA,History,History,OXFORD UNIV PRESS,NA +french history,0269-1191,1477-4542,NA,1,1,0,0,NA,History,History,OXFORD UNIV PRESS,NA +french review,0016-111X,2329-7131,NA,1,0,0,0,NA,NA,"Literature, Romance",AMER ASSOC TEACHERS FRENCH,NA +french screen studies,2643-8941,2643-895X,NA,1,0,0,0,NA,NA,"Film, Radio, Television","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +french studies,0016-1128,1468-2931,FrenchStudies,1,0,0,1,NA,NA,"Literature, Romance",OXFORD UNIV PRESS,2012-03-16 +frequenz,0016-1136,2191-6349,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WALTER DE GRUYTER GMBH,NA +fresenius environmental bulletin,1018-4619,1610-2304,NA,0,0,1,0,Environmental Sciences,NA,NA,PARLAR SCIENTIFIC PUBLICATIONS (P S P),NA +freshwater biology,0046-5070,1365-2427,NA,0,0,1,0,Ecology | Marine & Freshwater Biology,NA,NA,WILEY,NA +freshwater science,2161-9549,2161-9565,FreshwaterSci,0,0,1,1,Ecology | Marine & Freshwater Biology,NA,NA,UNIV CHICAGO PRESS,2014-10-18 +friction,2223-7690,2223-7704,FrictionJnl,0,0,1,1,"Engineering, Mechanical",NA,NA,SPRINGER,2019-06-20 +frontiers-a journal of women studies,0160-9009,1536-0334,Frontiers_Women,0,1,0,1,NA,Women'S Studies,NA,UNIV NEBRASKA PRESS,2012-08-16 +frontiers in aging neuroscience,1663-4365,1663-4365,NA,0,0,1,0,Geriatrics & Gerontology | Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in behavioral neuroscience,1662-5153,1662-5153,NA,0,0,1,0,Behavioral Sciences | Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in bioengineering and biotechnology,2296-4185,2296-4185,FrontBioeng,0,0,1,1,Multidisciplinary Sciences,NA,NA,FRONTIERS MEDIA SA,2013-05-27 +frontiers in bioscience-landmark,2768-6701,2768-6698,BiosciResInst,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,BIOSCIENCE RESEARCH INST-BRI,NA +frontiers in cardiovascular medicine,2297-055X,2297-055X,FrontCVMedicine,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,FRONTIERS MEDIA SA,2014-05-13 +frontiers in cell and developmental biology,2296-634X,2296-634X,FrontCellDevBio,0,0,1,1,Cell Biology | Developmental Biology,NA,NA,FRONTIERS MEDIA SA,2013-09-26 +frontiers in cellular and infection microbiology,2235-2988,2235-2988,FrontCellInfect,0,0,1,1,Immunology | Microbiology,NA,NA,FRONTIERS MEDIA SA,2018-05-02 +frontiers in cellular neuroscience,1662-5102,1662-5102,NA,0,0,1,0,Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in chemistry,2296-2646,2296-2646,FrontChemistry,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,FRONTIERS MEDIA SA,2013-04-05 +frontiers in computational neuroscience,1662-5188,1662-5188,NA,0,0,1,0,Mathematical & Computational Biology | Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in earth science,2296-6463,2296-6463,FrontEarthSci,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,FRONTIERS MEDIA SA,2013-10-25 +frontiers in ecology and evolution,2296-701X,2296-701X,NA,0,0,1,0,Ecology,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in ecology and the environment,1540-9295,1540-9309,ESAFrontiers,0,0,1,1,Ecology | Environmental Sciences,NA,NA,WILEY,2014-01-07 +frontiers in endocrinology,1664-2392,1664-2392,FrontEndocrinol,0,0,1,1,Endocrinology & Metabolism,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in energy,2095-1701,2095-1698,FIE_Journal,0,0,1,1,Energy & Fuels,NA,NA,HIGHER EDUCATION PRESS,2022-01-19 +frontiers in energy research,2296-598X,2296-598X,FrontEnergyRes,0,0,1,1,Energy & Fuels,NA,NA,FRONTIERS MEDIA SA,2013-10-16 +frontiers in environmental science,2296-665X,2296-665X,FrontEnvSci,0,0,1,1,Environmental Sciences,NA,NA,FRONTIERS MEDIA SA,2013-10-25 +frontiers in forests and global change,2624-893X,2624-893X,NA,0,0,1,0,Ecology | Forestry,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in genetics,1664-8021,1664-8021,FrontGenetics,0,0,1,1,Genetics & Heredity,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in human neuroscience,1662-5161,1662-5161,NA,0,0,1,0,Neurosciences | Psychology,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in immunology,1664-3224,1664-3224,FrontImmunol,0,0,1,1,Immunology,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in integrative neuroscience,1662-5145,1662-5145,NA,0,0,1,0,Behavioral Sciences | Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in marine science,2296-7745,2296-7745,FrontMarineSci,0,0,1,1,Marine & Freshwater Biology,NA,NA,FRONTIERS MEDIA SA,2013-12-10 +frontiers in materials,2296-8016,2296-8016,FrontMaterials,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,FRONTIERS MEDIA SA,2014-02-13 +frontiers in medicine,2296-858X,2296-858X,FrontMedicine,0,0,1,1,"Medicine, General & Internal",NA,NA,FRONTIERS MEDIA SA,2014-02-20 +frontiers in microbiology,1664-302X,1664-302X,FrontMicrobiol,0,0,1,1,Microbiology,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in molecular biosciences,2296-889X,2296-889X,FrontMolBioSci,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,FRONTIERS MEDIA SA,2014-02-27 +frontiers in molecular neuroscience,1662-5099,1662-5099,NA,0,0,1,0,Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in neural circuits,1662-5110,1662-5110,NA,0,0,1,0,Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in neuroanatomy,1662-5129,1662-5129,NA,0,0,1,0,Anatomy & Morphology | Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in neuroendocrinology,0091-3022,1095-6808,NA,0,0,1,0,Endocrinology & Metabolism | Neurosciences,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +frontiers in neuroinformatics,1662-5196,1662-5196,NA,0,0,1,0,Mathematical & Computational Biology | Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in neurology,1664-2295,1664-2295,FrontNeurol,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in neurorobotics,1662-5218,1662-5218,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Robotics | Neurosciences",NA,NA,FRONTIERS MEDIA SA,NA +frontiers in neuroscience,1662-453X,1662-453X,FrontNeurosci,0,0,1,1,Neurosciences,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in nutrition,2296-861X,2296-861X,FrontNutrition,0,0,1,1,Nutrition & Dietetics,NA,NA,FRONTIERS MEDIA SA,2013-12-10 +frontiers in oncology,2234-943X,2234-943X,FrontOncology,0,0,1,1,Oncology,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in pediatrics,2296-2360,2296-2360,FrontPediatrics,0,0,1,1,Pediatrics,NA,NA,FRONTIERS MEDIA SA,2013-04-08 +frontiers in pharmacology,1663-9812,1663-9812,FrontPharmacol,0,0,1,1,Pharmacology & Pharmacy,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in physics,2296-424X,2296-424X,FrontPhysics,0,0,1,1,"Physics, Multidisciplinary",NA,NA,FRONTIERS MEDIA SA,2013-05-27 +frontiers in physiology,1664-042X,1664-042X,FrontPhysiol,0,0,1,1,Physiology,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in plant science,1664-462X,1664-462X,FrontPlantSci,0,0,1,1,Plant Sciences,NA,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in psychiatry,1664-0640,1664-0640,FrontPsychiatry,0,1,1,1,Psychiatry,Psychiatry,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in psychiatry,1664-0640,1664-0640,FrontPsychiatry,0,1,1,1,Psychiatry,Psychiatry,NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in psychology,1664-1078,1664-1078,FrontPsychol,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,FRONTIERS MEDIA SA,2011-10-24 +frontiers in public health,2296-2565,2296-2565,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,FRONTIERS MEDIA SA,NA +frontiers in public health,2296-2565,2296-2565,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,FRONTIERS MEDIA SA,NA +frontiers in surgery,2296-875X,2296-875X,FrontSurgery,0,0,1,1,Surgery,NA,NA,FRONTIERS MEDIA SA,2014-03-05 +frontiers in sustainable food systems,2571-581X,2571-581X,NA,0,0,1,0,Food Science & Technology,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in synaptic neuroscience,1663-3563,1663-3563,NA,0,0,1,0,Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in systems neuroscience,1662-5137,1662-5137,NA,0,0,1,0,Neurosciences,NA,NA,FRONTIERS MEDIA SA,NA +frontiers in veterinary science,2297-1769,2297-1769,FrontVetScience,0,0,1,1,Veterinary Sciences,NA,NA,FRONTIERS MEDIA SA,2014-03-06 +frontiers in zoology,1742-9994,1742-9994,NA,0,0,1,0,Zoology,NA,NA,BMC,NA +frontiers of architectural research,2095-2635,2095-2643,NA,1,0,0,0,NA,NA,Architecture,ELSEVIER,NA +frontiers of chemical science and engineering,2095-0179,2095-0187,NA,0,0,1,0,"Engineering, Chemical",NA,NA,SPRINGER,NA +frontiers of computer science,2095-2228,2095-2236,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,HIGHER EDUCATION PRESS,NA +frontiers of earth science,2095-0195,2095-0209,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +frontiers of environmental science & engineering,2095-2201,2095-221X,FESE_journal,0,0,1,1,"Engineering, Environmental | Environmental Sciences",NA,NA,HIGHER EDUCATION PRESS,2022-01-28 +frontiers of hormone research,0301-3073,1662-3762,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,KARGER,NA +frontiers of information technology & electronic engineering,2095-9184,2095-9230,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering | Engineering, Electrical & Electronic",NA,NA,ZHEJIANG UNIV PRESS,NA +frontiers of materials science,2095-025X,2095-0268,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,HIGHER EDUCATION PRESS,NA +frontiers of mathematics in china,1673-3452,1673-3576,NA,0,0,1,0,Mathematics,NA,NA,HIGHER EDUCATION PRESS,NA +frontiers of mechanical engineering,2095-0233,2095-0241,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,HIGHER EDUCATION PRESS,NA +frontiers of medicine,2095-0217,2095-0225,NA,0,0,1,0,"Oncology | Medicine, Research & Experimental",NA,NA,SPRINGER,NA +frontiers of physics,2095-0462,2095-0470,frontphys,0,0,1,1,"Physics, Multidisciplinary",NA,NA,HIGHER EDUCATION PRESS,2022-02-24 +frontiers of structural and civil engineering,2095-2430,2095-2449,NA,0,0,1,0,"Engineering, Civil",NA,NA,HIGHER EDUCATION PRESS,NA +fruits,0248-1294,1625-967X,NA,0,0,1,0,Horticulture,NA,NA,INT SOC HORTICULTURAL SCIENCE-ISHS,NA +fuel,0016-2361,1873-7153,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +fuel cells,1615-6846,1615-6854,NA,0,0,1,0,Electrochemistry | Energy & Fuels,NA,NA,WILEY-V C H VERLAG GMBH,NA +fuel processing technology,0378-3820,1873-7188,NA,0,0,1,0,"Chemistry, Applied | Energy & Fuels | Engineering, Chemical",NA,NA,ELSEVIER,NA +fullerenes nanotubes and carbon nanostructures,1536-383X,1536-4046,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Atomic, Molecular & Chemical",NA,NA,TAYLOR & FRANCIS INC,NA +functional & integrative genomics,1438-793X,1438-7948,NA,0,0,1,0,Genetics & Heredity,NA,NA,SPRINGER HEIDELBERG,NA +functional analysis and its applications,0016-2663,1573-8485,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,PLEIADES PUBLISHING INC,NA +functional ecology,0269-8463,1365-2435,FunEcology,0,0,1,1,Ecology,NA,NA,WILEY,2009-11-05 +functional materials letters,1793-6047,1793-7213,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +functional plant biology,1445-4408,1445-4416,NA,0,0,1,0,Plant Sciences,NA,NA,CSIRO PUBLISHING,NA +functions of language,0929-998X,1569-9765,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +functions of language,0929-998X,1569-9765,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +fundamenta informaticae,0169-2968,1875-8681,NA,0,0,1,0,"Computer Science, Software Engineering | Mathematics, Applied",NA,NA,IOS PRESS,NA +fundamenta mathematicae,0016-2736,1730-6329,NA,0,0,1,0,Mathematics,NA,NA,POLISH ACAD SCIENCES INST MATHEMATICS-IMPAN,NA +fundamental & clinical pharmacology,0767-3981,1472-8206,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,WILEY,NA +fundamental and applied limnology,1863-9135,1863-9135,NA,0,0,1,0,Limnology | Marine & Freshwater Biology,NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +fungal biology,1878-6146,1878-6162,NA,0,0,1,0,Mycology,NA,NA,ELSEVIER SCI LTD,NA +fungal biology reviews,1749-4613,1878-0253,NA,0,0,1,0,Mycology,NA,NA,ELSEVIER SCI LTD,NA +fungal diversity,1560-2745,1878-9129,NA,0,0,1,0,Mycology,NA,NA,SPRINGER,NA +fungal ecology,1754-5048,1878-0083,NA,0,0,1,0,Ecology | Mycology,NA,NA,ELSEVIER SCI LTD,NA +fungal genetics and biology,1087-1845,1096-0937,NA,0,0,1,0,Genetics & Heredity | Mycology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +funkcialaj ekvacioj-serio internacia,0532-8721,NA,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,"KOBE UNIV, DEPT MATHEMATICS",NA +fusion engineering and design,0920-3796,1873-7196,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,ELSEVIER SCIENCE SA,NA +fusion science and technology,1536-1055,1943-7641,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,TAYLOR & FRANCIS INC,NA +future anterior,1549-9715,1934-6026,Future_Anterior,1,0,0,1,NA,NA,Architecture,UNIV MINNESOTA PRESS,2014-05-29 +future generation computer systems-the international journal of escience,0167-739X,1872-7115,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +future medicinal chemistry,1756-8919,1756-8927,fsgfmc,0,0,1,1,"Chemistry, Medicinal",NA,NA,FUTURE SCI LTD,2014-07-29 +future microbiology,1746-0913,1746-0921,fsgfmb,0,0,1,1,Microbiology,NA,NA,FUTURE MEDICINE LTD,2014-07-15 +future of children,1054-8289,1550-1558,FutureChildren,0,1,0,1,NA,"Family Studies | Health Policy & Services | Social Sciences, Interdisciplinary",NA,PRINCETON UNIV,2009-07-15 +future oncology,1479-6694,1744-8301,FutureOncol_FSG,0,0,1,1,Oncology,NA,NA,FUTURE MEDICINE LTD,2014-07-15 +future virology,1746-0794,1746-0808,fsgfvl,0,0,1,1,Virology,NA,NA,FUTURE MEDICINE LTD,2014-07-15 +futures,0016-3287,1873-6378,futures_journal,0,1,0,1,NA,Economics | Regional & Urban Planning,NA,ELSEVIER SCI LTD,2021-04-22 +fuzzy optimization and decision making,1568-4539,1573-2908,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Operations Research & Management Science",NA,NA,SPRINGER,NA +fuzzy sets and systems,0165-0114,1872-6801,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied | Statistics & Probability",NA,NA,ELSEVIER,NA +g3-genes genomes genetics,2160-1836,2160-1836,NA,0,0,1,0,Genetics & Heredity,NA,NA,OXFORD UNIV PRESS INC,NA +gaceta medica de mexico,0016-3813,2696-1288,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ACAD NACIONAL MEDICINA MEXICO,NA +gaceta sanitaria,0213-9111,1578-1283,gacetasanitaria,0,1,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,ELSEVIER,2011-01-10 +gaceta sanitaria,0213-9111,1578-1283,gacetasanitaria,0,1,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,ELSEVIER,2011-01-10 +gaia-ecological perspectives for science and society,0940-5550,2625-5413,journal_GAIA,0,1,1,1,Environmental Sciences,Environmental Studies,NA,OEKOM VERLAG GMBH,2015-02-11 +gaia-ecological perspectives for science and society,0940-5550,2625-5413,journal_GAIA,0,1,1,1,Environmental Sciences,Environmental Studies,NA,OEKOM VERLAG GMBH,2015-02-11 +gait & posture,0966-6362,1879-2219,NA,0,0,1,0,Neurosciences | Orthopedics | Sport Sciences,NA,NA,ELSEVIER IRELAND LTD,NA +galilaeana-studies in renaissance and early modern science,1971-6052,1825-3903,NA,1,0,0,0,NA,NA,History & Philosophy Of Science,CASA EDITRICE LEO S OLSCHKI,NA +games and culture,1555-4120,1555-4139,NA,1,1,0,0,NA,Cultural Studies | Communication,Cultural Studies,SAGE PUBLICATIONS INC,NA +games and culture,1555-4120,1555-4139,NA,1,1,0,0,NA,Cultural Studies | Communication,Cultural Studies,SAGE PUBLICATIONS INC,NA +games and economic behavior,0899-8256,1090-2473,NA,0,1,0,0,NA,Economics,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +games for health journal,2161-783X,2161-7856,GamesforHealthJ,0,1,0,1,NA,"Public, Environmental & Occupational Health | Rehabilitation",NA,"MARY ANN LIEBERT, INC",2018-01-18 +gastric cancer,1436-3291,1436-3305,NA,0,0,1,0,Oncology | Gastroenterology & Hepatology,NA,NA,SPRINGER,NA +gastroenterologia y hepatologia,0210-5705,0210-5705,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,ELSEVIER ESPANA SLU,NA +gastroenterology,0016-5085,1528-0012,AGA_Gastro,0,0,1,1,Gastroenterology & Hepatology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2017-03-29 +gastroenterology clinics of north america,0889-8553,1558-1942,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +gastroenterology nursing,1042-895X,1538-9766,NA,0,1,1,0,Gastroenterology & Hepatology | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +gastroenterology nursing,1042-895X,1538-9766,NA,0,1,1,0,Gastroenterology & Hepatology | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +gastroenterology report,2052-0034,2052-0034,GastroRept,0,0,1,1,Gastroenterology & Hepatology,NA,NA,OXFORD UNIV PRESS,2018-06-12 +gastroenterology research and practice,1687-6121,1687-630X,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,HINDAWI LTD,NA +gastrointestinal endoscopy,0016-5107,1097-6779,GIE_Journal,0,0,1,1,Gastroenterology & Hepatology,NA,NA,MOSBY-ELSEVIER,2011-04-04 +gayana,0717-6538,0717-6538,NA,0,0,1,0,Zoology,NA,NA,"EDICIONES UNIV, CONCEPCION",NA +gayana botanica,0016-5301,0717-6643,GayanaBotanica,0,0,1,1,Plant Sciences,NA,NA,"EDICIONES UNIV, CONCEPCION",2019-05-14 +geburtshilfe und frauenheilkunde,0016-5751,1438-8804,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,GEORG THIEME VERLAG KG,NA +gedrag & organisatie,0921-5077,1875-7235,NA,0,1,0,0,NA,"Psychology, Applied | Psychology, Social",NA,UITGEVERIJ LEMMA B V,NA +gefahrstoffe reinhaltung der luft,0949-8036,1436-4891,NA,0,0,1,0,"Engineering, Environmental | Engineering, Civil | Environmental Sciences",NA,NA,SPRINGER-V D I VERLAG GMBH & CO KG,NA +gels,2310-2861,2310-2861,Gels_MDPI,0,0,1,1,Polymer Science,NA,NA,MDPI,2016-03-24 +gematologiya i transfuziologiya,0234-5730,2411-3042,NA,0,0,1,0,Hematology,NA,NA,MINISTERSTVO ZDRAVOOKHRANENIYA,NA +gems & gemology,0016-626X,2376-4473,NA,0,0,1,0,Mineralogy,NA,NA,GEMOLOGICAL INST AMER,NA +gender & society,0891-2432,1552-3977,gend_soc,0,1,0,1,NA,Sociology | Women'S Studies,NA,SAGE PUBLICATIONS INC,2011-05-31 +gender and education,0954-0253,1360-0516,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +gender and history,0953-5233,1468-0424,GenderHistory,1,1,0,1,NA,History | Women'S Studies,History,WILEY,2014-05-25 +gender and history,0953-5233,1468-0424,GenderHistory,1,1,0,1,NA,History | Women'S Studies,History,WILEY,2014-05-25 +gender and language,1747-6321,1747-633X,GenderLanguage,1,1,0,1,NA,Linguistics | Women'S Studies,Language & Linguistics,EQUINOX PUBLISHING LTD,2020-06-12 +gender and language,1747-6321,1747-633X,GenderLanguage,1,1,0,1,NA,Linguistics | Women'S Studies,Language & Linguistics,EQUINOX PUBLISHING LTD,2020-06-12 +gender in management,1754-2413,1754-2421,NA,0,1,0,0,NA,Business | Management | Women'S Studies,NA,EMERALD GROUP PUBLISHING LTD,NA +gender place and culture,0966-369X,1360-0524,GPCjournal,0,1,0,1,NA,Geography | Women'S Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-11-18 +gender work and organization,0968-6673,1468-0432,GenderWorkOrg,0,1,0,1,NA,Management | Women'S Studies,NA,WILEY,2018-05-30 +gene,0378-1119,1879-0038,NA,0,0,1,0,Genetics & Heredity,NA,NA,ELSEVIER,NA +gene expression patterns,1567-133X,1872-7298,NA,0,0,1,0,Developmental Biology | Genetics & Heredity,NA,NA,ELSEVIER,NA +gene therapy,0969-7128,1476-5462,GeneTherapy_SN,0,0,1,1,"Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Genetics & Heredity | Medicine, Research & Experimental",NA,NA,SPRINGERNATURE,2017-02-17 +general and comparative endocrinology,0016-6480,1095-6840,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +general hospital psychiatry,0163-8343,1873-7714,GHP_Journal,0,1,1,1,Psychiatry,Psychiatry,NA,ELSEVIER SCIENCE INC,2018-06-10 +general hospital psychiatry,0163-8343,1873-7714,GHP_Journal,0,1,1,1,Psychiatry,Psychiatry,NA,ELSEVIER SCIENCE INC,2018-06-10 +general physiology and biophysics,0231-5882,1338-4325,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics | Physiology,NA,NA,AEPRESS SRO,NA +general relativity and gravitation,0001-7701,1572-9532,NA,0,0,1,0,"Astronomy & Astrophysics | Physics, Multidisciplinary | Physics, Particles & Fields",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +general thoracic and cardiovascular surgery,1863-6705,1863-6713,NA,0,0,1,0,Cardiac & Cardiovascular System | Surgery,NA,NA,SPRINGER JAPAN KK,NA +generations-journal of the american society on aging,0738-7806,0738-7806,NA,0,1,0,0,NA,Gerontology,NA,AMER SOC AGING,NA +genes,2073-4425,2073-4425,Genes_MDPI,0,0,1,1,Genetics & Heredity,NA,NA,MDPI,2016-03-24 +genes & development,0890-9369,1549-5477,GenesDev,0,0,1,1,Cell Biology | Developmental Biology | Genetics & Heredity,NA,NA,"COLD SPRING HARBOR LAB PRESS, PUBLICATIONS DEPT",2009-07-09 +genes & diseases,2352-4820,2352-3042,NA,0,0,1,0,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,ELSEVIER,NA +genes & genetic systems,1341-7568,1880-5779,NA,0,0,1,0,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,GENETICS SOC JAPAN,NA +genes & genomics,1976-9571,2092-9293,NA,0,0,1,0,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,SPRINGER,NA +genes and environment,1880-7046,1880-7062,NA,0,0,1,0,Genetics & Heredity | Toxicology,NA,NA,BMC,NA +genes and immunity,1466-4879,1476-5470,NA,0,0,1,0,Genetics & Heredity | Immunology,NA,NA,SPRINGERNATURE,NA +genes and nutrition,1555-8932,1865-3499,NA,0,0,1,0,Genetics & Heredity | Nutrition & Dietetics,NA,NA,BMC,NA +genes brain and behavior,1601-1848,1601-183X,Genes2B,0,0,1,1,Behavioral Sciences | Neurosciences,NA,NA,WILEY,2009-05-26 +genes chromosomes & cancer,1045-2257,1098-2264,NA,0,0,1,0,Oncology | Genetics & Heredity,NA,NA,WILEY,NA +genes to cells,1356-9597,1365-2443,NA,0,0,1,0,Cell Biology | Genetics & Heredity,NA,NA,WILEY,NA +genesis,1526-954X,1526-968X,NA,0,0,1,0,Developmental Biology | Genetics & Heredity,NA,NA,WILEY,NA +genetic epidemiology,0741-0395,1098-2272,NA,0,0,1,0,Genetics & Heredity | Mathematical & Computational Biology,NA,NA,WILEY,NA +genetic programming and evolvable machines,1389-2576,1573-7632,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +genetic resources and crop evolution,0925-9864,1573-5109,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,SPRINGER,NA +genetic testing and molecular biomarkers,1945-0265,1945-0257,NA,0,0,1,0,Genetics & Heredity,NA,NA,"MARY ANN LIEBERT, INC",NA +genetica,0016-6707,1573-6857,NA,0,0,1,0,Genetics & Heredity,NA,NA,SPRINGER,NA +genetics,0016-6731,1943-2631,NA,0,0,1,0,Genetics & Heredity,NA,NA,OXFORD UNIV PRESS INC,NA +genetics and molecular biology,1415-4757,1678-4685,NA,0,0,1,0,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,SOC BRASIL GENETICA,NA +genetics in medicine,1098-3600,1530-0366,GIMJournal,0,0,1,1,Genetics & Heredity,NA,NA,SPRINGERNATURE,2015-02-05 +genetics research,0016-6723,1469-5073,GeneticsRes,0,0,1,1,Genetics & Heredity,NA,NA,HINDAWI LTD,2019-03-11 +genetics selection evolution,0999-193X,1297-9686,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Genetics & Heredity",NA,NA,BMC,NA +genetika-belgrade,0534-0012,1820-6069,NA,0,0,1,0,Agronomy | Genetics & Heredity,NA,NA,SERBIAN GENETICS SOC,NA +geneva papers on risk and insurance-issues and practice,1018-5895,1468-0440,NA,0,1,0,0,NA,"Business, Finance",NA,PALGRAVE MACMILLAN LTD,NA +geneva risk and insurance review,1554-964X,1554-9658,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,PALGRAVE MACMILLAN LTD,NA +genome,0831-2796,1480-3321,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,CANADIAN SCIENCE PUBLISHING,NA +genome biology,1474-760X,1474-760X,GenomeBiology,0,0,1,1,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,BMC,2010-02-17 +genome biology and evolution,1759-6653,1759-6653,GenomeBiolEvol,0,0,1,1,Evolutionary Biology | Genetics & Heredity,NA,NA,OXFORD UNIV PRESS,2018-07-23 +genome medicine,1756-994X,1756-994X,GenomeMedicine,0,0,1,1,Genetics & Heredity,NA,NA,BMC,2010-03-30 +genome research,1088-9051,1549-5469,genomeresearch,0,0,1,1,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,"COLD SPRING HARBOR LAB PRESS, PUBLICATIONS DEPT",2009-02-18 +genomics,0888-7543,1089-8646,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +genomics proteomics & bioinformatics,1672-0229,2210-3244,GPBees,0,0,1,1,Genetics & Heredity,NA,NA,ELSEVIER,2020-01-07 +geo-marine letters,0276-0460,1432-1157,GeoMarLetters,0,0,1,1,"Geosciences, Multidisciplinary | Oceanography",NA,NA,SPRINGER,2020-06-30 +geo-spatial information science,1009-5020,1993-5153,GsisOffice,0,0,1,1,Remote Sensing,NA,NA,TAYLOR & FRANCIS LTD,2020-08-25 +geoarchaeology-an international journal,0883-6353,1520-6548,NA,1,0,1,0,"Geosciences, Multidisciplinary",NA,Archaeology,WILEY,NA +geoarchaeology-an international journal,0883-6353,1520-6548,NA,1,0,1,0,"Geosciences, Multidisciplinary",NA,Archaeology,WILEY,NA +geobiology,1472-4677,1472-4669,NA,0,0,1,0,"Biology | Environmental Sciences | Geosciences, Multidisciplinary",NA,NA,WILEY,NA +geobios,0016-6995,1777-5728,NA,0,0,1,0,Paleontology,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +geocarto international,1010-6049,1752-0762,NA,0,0,1,0,"Environmental Sciences | Geosciences, Multidisciplinary | Remote Sensing | Imaging Science & Photographic Technology",NA,NA,TAYLOR & FRANCIS LTD,NA +geochemical journal,0016-7002,1880-5973,GeochemicalJ,0,0,1,1,Geochemistry & Geophysics,NA,NA,GEOCHEMICAL SOC JAPAN,2020-08-07 +geochemical perspectives,2223-7755,2224-2759,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,EUROPEAN ASSOC GEOCHEMISTRY,NA +geochemical perspectives letters,2410-339X,2410-3403,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,EUROPEAN ASSOC GEOCHEMISTRY,NA +geochemical transactions,1467-4866,1467-4866,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,BMC,NA +geochemistry,0009-2819,1611-5864,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,ELSEVIER GMBH,NA +geochemistry-exploration environment analysis,1467-7873,2041-4943,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,GEOLOGICAL SOC PUBL HOUSE,NA +geochemistry geophysics geosystems,1525-2027,1525-2027,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,AMER GEOPHYSICAL UNION,NA +geochemistry international,0016-7029,1556-1968,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +geochimica et cosmochimica acta,0016-7037,1872-9533,GCA_Journal,0,0,1,1,Geochemistry & Geophysics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2020-06-16 +geochronometria,1897-1695,1897-1695,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SCIENDO,NA +geoderma,0016-7061,1872-6259,Geoderma_Jrnl,0,0,1,1,Soil Science,NA,NA,ELSEVIER,2018-12-07 +geoderma regional,2352-0094,2352-0094,GeodermaR,0,0,1,1,Soil Science,NA,NA,ELSEVIER,2019-08-06 +geodetski vestnik,0351-0271,1581-1328,NA,0,1,0,0,NA,Geography,NA,ASSOC SURVEYORS SLOVENIA,NA +geodiversitas,1280-9659,1638-9395,NA,0,0,1,0,Paleontology,NA,NA,MUSEUM NATL HISTOIRE NATURELLE,NA +geofisica internacional,0016-7169,0016-7169,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,INST GEOPHYSICS UNAM,NA +geofizika,0352-3659,1846-6346,NA,0,0,1,0,"Geochemistry & Geophysics | Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,"UNIV ZAGREB , ANDRIJA MOHOROVICIC GEOPHYS INST",NA +geofluids,1468-8115,1468-8123,NA,0,0,1,0,Geochemistry & Geophysics | Geology,NA,NA,WILEY-HINDAWI,NA +geoforum,0016-7185,1872-9398,NA,0,1,0,0,NA,Geography,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +geografia fisica e dinamica quaternaria,0391-9838,1724-4781,NA,0,0,1,0,"Geography, Physical",NA,NA,COMITATO GLACIOLOGICO ITALIANO,NA +geografie,1212-0014,1212-0014,NA,0,1,0,0,NA,Geography,NA,CZECH GEOGRAPHIC SOC,NA +geografisk tidsskrift-danish journal of geography,0016-7223,1903-2471,NA,0,1,0,0,NA,Environmental Studies | Geography,NA,ROYAL DANISH GEOGRAPHICAL SOC,NA +geografiska annaler series a-physical geography,0435-3676,1468-0459,NA,0,0,1,0,"Geography, Physical | Geology",NA,NA,TAYLOR & FRANCIS LTD,NA +geografiska annaler series b-human geography,0435-3684,1468-0467,NA,0,1,0,0,NA,Geography,NA,TAYLOR & FRANCIS LTD,NA +geographical analysis,0016-7363,1538-4632,geoganalysis,0,1,0,1,NA,Geography,NA,WILEY,2018-02-20 +geographical journal,0016-7398,1475-4959,geogjournal,0,1,0,1,NA,Geography,NA,WILEY,2009-11-19 +geographical research,1745-5863,1745-5871,geogresearch,0,1,0,1,NA,Geography,NA,WILEY,2016-04-09 +geographical review,0016-7428,1931-0846,Geog_Review,0,1,0,1,NA,Geography,NA,TAYLOR & FRANCIS INC,2022-03-03 +geography,0016-7487,2043-6564,NA,0,1,0,0,NA,Geography,NA,TAYLOR & FRANCIS LTD,NA +geography compass,1749-8198,1749-8198,NA,0,1,0,0,NA,Geography,NA,WILEY,NA +geohealth,2471-1403,2471-1403,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,AMER GEOPHYSICAL UNION,NA +geoheritage,1867-2477,1867-2485,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +geoinformatica,1384-6175,1573-7624,NA,0,0,1,0,"Computer Science, Information Systems | Geography, Physical",NA,NA,SPRINGER,NA +geologia croatica,1330-030X,1333-4875,NA,0,0,1,0,Geology,NA,NA,CROATIAN GEOLOGICAL SURVEY,NA +geologica acta,1695-6133,1696-5728,geoacta,0,0,1,1,Geology,NA,NA,UNIV BARCELONA,2018-07-09 +geologica belgica,1374-8505,2034-1954,GeolBel_journal,0,0,1,1,Geology,NA,NA,GEOLOGICA BELGICA,2022-02-04 +geologica carpathica,1335-0552,1336-8052,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SLOVAK ACAD SCIENCES GEOLOGICAL INST,NA +geological journal,0072-1050,1099-1034,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,WILEY,NA +geological magazine,0016-7568,1469-5081,GeologicalMag,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,2017-10-04 +geological quarterly,1641-7291,2082-5099,NA,0,0,1,0,Geology,NA,NA,POLISH GEOLOGICAL INST,NA +geological society of america bulletin,0016-7606,1943-2674,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,"GEOLOGICAL SOC AMER, INC",NA +geology,0091-7613,1943-2682,NA,0,0,1,0,Geology,NA,NA,"GEOLOGICAL SOC AMER, INC",NA +geology of ore deposits,1075-7015,1555-6476,NA,0,0,1,0,Geology | Mineralogy,NA,NA,PLEIADES PUBLISHING INC,NA +geomagnetism and aeronomy,0016-7932,1555-645X,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +geomatics natural hazards & risk,1947-5705,1947-5713,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Water Resources",NA,NA,TAYLOR & FRANCIS LTD,NA +geomechanics and engineering,2005-307X,2092-6219,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological",NA,NA,TECHNO-PRESS,NA +geomechanics and geophysics for geo-energy and geo-resources,2363-8419,2363-8427,NA,0,0,1,0,"Energy & Fuels | Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +geomechanics for energy and the environment,2352-3808,2352-3808,NA,0,0,1,0,"Energy & Fuels | Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +geometriae dedicata,0046-5755,1572-9168,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +geometric and functional analysis,1016-443X,1420-8970,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER BASEL AG,NA +geometry & topology,1465-3060,1364-0380,NA,0,0,1,0,Mathematics,NA,NA,GEOMETRY & TOPOLOGY PUBLICATIONS,NA +geomicrobiology journal,0149-0451,1521-0529,NA,0,0,1,0,"Environmental Sciences | Geosciences, Multidisciplinary",NA,NA,TAYLOR & FRANCIS INC,NA +geomorphologie-relief processus environnement,1266-5304,1957-777X,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,GROUPE FRANCIAS GEOMORPHOLOGIE,NA +geomorphology,0169-555X,1872-695X,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +geophysical and astrophysical fluid dynamics,0309-1929,1029-0419,NA,0,0,1,0,Astronomy & Astrophysics | Geochemistry & Geophysics | Mechanics,NA,NA,TAYLOR & FRANCIS LTD,NA +geophysical journal international,0956-540X,1365-246X,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,OXFORD UNIV PRESS,NA +geophysical prospecting,0016-8025,1365-2478,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,WILEY,NA +geophysical research letters,0094-8276,1944-8007,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,AMER GEOPHYSICAL UNION,NA +geophysics,0016-8033,1942-2156,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SOC EXPLORATION GEOPHYSICISTS,NA +geopolitics,1465-0045,1557-3028,geopolitics_jl,0,1,0,1,NA,Geography | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-04-07 +george washington law review,0016-8076,0016-8076,gwlaw,0,1,0,1,NA,Law,NA,GEORGE WASHINGTON UNIV,2011-08-17 +georgetown law journal,0016-8092,0016-8092,georgetownlj,0,1,0,1,NA,Law,NA,GEORGETOWN LAW JOURNAL ASSOC,2011-03-20 +georgia review,0016-8386,NA,GeorgiaReview,1,0,0,1,NA,NA,Literary Reviews,UNIV GEORGIA,2009-07-24 +georgian mathematical journal,1072-947X,1572-9176,NA,0,0,1,0,Mathematics,NA,NA,WALTER DE GRUYTER GMBH,NA +georisk-assessment and management of risk for engineered systems and geohazards,1749-9518,1749-9526,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +geoscience canada,0315-0941,1911-4850,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,GEOLOGICAL ASSOC CANADA,NA +geoscience data journal,2049-6060,2049-6060,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,WILEY,NA +geoscience frontiers,1674-9871,1674-9871,GeosciFrontiers,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,"CHINA UNIV GEOSCIENCES, BEIJING",2016-10-18 +geoscience letters,2196-4092,2196-4092,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,SPRINGER,NA +geosciences journal,1226-4806,1598-7477,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,GEOLOGICAL SOCIETY KOREA,NA +geoscientific instrumentation methods and data systems,2193-0856,2193-0864,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,COPERNICUS GESELLSCHAFT MBH,NA +geoscientific model development,1991-959X,1991-9603,EGU_GMD,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-14 +geospatial health,1827-1987,1970-7096,NA,0,0,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health",NA,NA,UNIV NAPLES FEDERICO II,NA +geosphere,1553-040X,1553-040X,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,"GEOLOGICAL SOC AMER, INC",NA +geostandards and geoanalytical research,1639-4488,1751-908X,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,WILEY,NA +geosynthetics international,1072-6349,1751-7613,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,ICE PUBLISHING,NA +geotechnical testing journal,0149-6115,1945-7545,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,AMER SOC TESTING MATERIALS,NA +geotechnique,0016-8505,1751-7656,NA,0,0,1,0,"Engineering, Geological",NA,NA,ICE PUBLISHING,NA +geotechnique letters,2049-825X,2045-2543,NA,0,0,1,0,"Engineering, Geological",NA,NA,ICE PUBLISHING,NA +geotectonics,0016-8521,1556-1976,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,PLEIADES PUBLISHING INC,NA +geotextiles and geomembranes,0266-1144,1879-3584,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +geothermal energy,2195-9706,2195-9706,NA,0,0,1,0,"Energy & Fuels | Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +geothermics,0375-6505,1879-3576,NA,0,0,1,0,"Energy & Fuels | Geosciences, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +geriatric nursing,0197-4572,1528-3984,gnjournal,0,1,1,1,Geriatrics & Gerontology | Nursing,Nursing | Gerontology,NA,MOSBY-ELSEVIER,2018-06-17 +geriatric nursing,0197-4572,1528-3984,gnjournal,0,1,1,1,Geriatrics & Gerontology | Nursing,Nursing | Gerontology,NA,MOSBY-ELSEVIER,2018-06-17 +geriatric orthopaedic surgery & rehabilitation,2151-4585,2151-4593,NA,0,0,1,0,Geriatrics & Gerontology | Orthopedics | Rehabilitation | Surgery,NA,NA,SAGE PUBLICATIONS INC,NA +geriatrics & gerontology international,1444-1586,1447-0594,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,WILEY,NA +geriatrics & gerontology international,1444-1586,1447-0594,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,WILEY,NA +geriatrie et psychologie neuropsychiatrie de vieillissement,2115-8789,2115-7863,NA,0,0,1,0,Psychiatry | Psychology,NA,NA,JOHN LIBBEY EUROTEXT LTD,NA +german economic review,1465-6485,1468-0475,NA,0,1,0,0,NA,Economics,NA,WALTER DE GRUYTER GMBH,NA +german history,0266-3554,1477-089X,germanhistsoc,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2015-01-16 +german history,0266-3554,1477-089X,germanhistsoc,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2015-01-16 +german journal of agricultural economics,0002-1121,0515-6866,NA,0,0,1,0,Agricultural Economics & Policy,NA,NA,DEUTSCHER FACHVERLAG GMBH,NA +german journal of human resource management-zeitschrift fur personalforschung,2397-0022,2397-0030,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,SAGE PUBLICATIONS INC,NA +german life and letters,0016-8777,1468-0483,glljournal,1,0,0,1,NA,NA,"Literature, German, Dutch, Scandinavian",WILEY,2015-09-16 +german politics,0964-4008,1743-8993,germanpoljnl,0,1,0,1,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-10-21 +german quarterly,0016-8831,1756-1183,GermanQuarterly,1,0,0,1,NA,NA,"Literature, German, Dutch, Scandinavian | Language & Linguistics",WILEY,2021-10-19 +german studies review,0149-7952,2164-8646,NA,1,1,0,0,NA,Area Studies,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,NA +german studies review,0149-7952,2164-8646,NA,1,1,0,0,NA,Area Studies,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,NA +germanic review,0016-8890,1930-6962,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +germanisch-romanische monatsschrift,0016-8904,0016-8904,NA,1,0,0,0,NA,NA,Literature,UNIVERSITATSVERLAG C WINTER HEIDELBERG GMBH,NA +gerodontology,0734-0664,1741-2358,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Geriatrics & Gerontology",NA,NA,WILEY,NA +gerontologist,0016-9013,1758-5341,NA,0,1,0,0,NA,Gerontology,NA,OXFORD UNIV PRESS INC,NA +gerontology,0304-324X,1423-0003,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,KARGER,NA +geroscience,2509-2715,2509-2723,GeroScienceAGE,0,0,1,1,Geriatrics & Gerontology,NA,NA,SPRINGER,2022-02-07 +geschichte und gesellschaft,0340-613X,2196-9000,NA,1,0,0,0,NA,NA,History,VANDENHOECK & RUPRECHT GMBH & CO KG,NA +gesnerus-swiss journal of the history of medicine and sciences,0016-9161,2297-7953,NA,1,0,0,0,NA,NA,History & Philosophy Of Science,SCHWABE AG BASEL,NA +gesta-international center of medieval art,0016-920X,2169-3099,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies | Art,UNIV CHICAGO PRESS,NA +gestion y politica publica,1405-1079,2448-9182,NA,0,1,0,0,NA,Public Administration,NA,CENTRO DE INVESTIGACION Y DOCENCIA ECONOMICAS,NA +gesture,1568-1475,1569-9773,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +gesture,1568-1475,1569-9773,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +gesunde pflanzen,0367-4223,1439-0345,NA,0,0,1,0,Agronomy,NA,NA,SPRINGER,NA +gesundheitswesen,0941-3790,1439-4421,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,GEORG THIEME VERLAG KG,NA +getty research journal,1944-8740,2329-1249,NA,1,0,0,0,NA,NA,Art,UNIV CHICAGO PRESS,NA +geus bulletin,2597-2154,2597-2154,GeusBulletin,0,0,1,1,Geology,NA,NA,GEOLOGICAL SURVEY DENMARK & GREENLAND,2020-04-09 +gff,1103-5897,2000-0863,NA,0,0,1,0,Geology | Paleontology,NA,NA,TAYLOR & FRANCIS LTD,NA +gifted child quarterly,0016-9862,1934-9041,GCQjournal,0,1,0,1,NA,"Education, Special | Psychology, Educational",NA,SAGE PUBLICATIONS INC,2018-11-19 +gigascience,2047-217X,2047-217X,GigaScience,0,0,1,1,Multidisciplinary Sciences,NA,NA,OXFORD UNIV PRESS,2010-10-28 +ginekologia polska,0017-0011,2543-6767,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,VIA MEDICA,NA +giornale critico della filosofia italiana,0017-0089,NA,NA,1,0,0,0,NA,NA,Philosophy,CASA EDITRICE G C SANSONI SPA,NA +giornale storico della letteratura italiana,0017-0496,0017-0496,NA,1,0,0,0,NA,NA,"Literature, Romance",CASA EDITRICE LOESCHER,NA +giscience & remote sensing,1548-1603,1943-7226,NA,0,0,1,0,"Geography, Physical | Remote Sensing",NA,NA,TAYLOR & FRANCIS LTD,NA +gladius,0436-029X,1988-4168,NA,1,0,0,0,NA,NA,History,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +gland surgery,2227-684X,2227-8575,NA,0,0,1,0,Surgery,NA,NA,AME PUBL CO,NA +glasgow mathematical journal,0017-0895,1469-509X,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +glasnik matematicki,0017-095X,1846-7989,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,CROATIAN MATHEMATICAL SOC,NA +glass and ceramics,0361-7610,1573-8515,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,SPRINGER,NA +glass physics and chemistry,1087-6596,1608-313X,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,PLEIADES PUBLISHING INC,NA +glass technology-european journal of glass science and technology part a,1753-3546,1753-3554,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,SOC GLASS TECHNOLOGY,NA +glia,0894-1491,1098-1136,GLIA_Journal,0,0,1,1,Neurosciences,NA,NA,WILEY,2013-05-06 +global and planetary change,0921-8181,1872-6364,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +global biogeochemical cycles,0886-6236,1944-9224,NA,0,0,1,0,"Environmental Sciences | Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,AMER GEOPHYSICAL UNION,NA +global challenges,2056-6646,2056-6646,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,WILEY-V C H VERLAG GMBH,NA +global change biology,1354-1013,1365-2486,GlobalChangeBio,0,0,1,1,Biodiversity Conservation | Ecology | Environmental Sciences,NA,NA,WILEY,2010-10-05 +global change biology bioenergy,1757-1693,1757-1707,NA,0,0,1,0,Agronomy | Energy & Fuels,NA,NA,WILEY,NA +global ecology and biogeography,1466-822X,1466-8238,GEB_macro,0,0,1,1,"Ecology | Geography, Physical",NA,NA,WILEY,2016-09-09 +global ecology and conservation,2351-9894,2351-9894,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,ELSEVIER,NA +global economic review,1226-508X,1744-3873,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +global environmental change-human and policy dimensions,0959-3780,1872-9495,GEC_Journal,0,1,1,1,Environmental Sciences,Environmental Studies | Geography,NA,ELSEVIER SCI LTD,2021-09-02 +global environmental change-human and policy dimensions,0959-3780,1872-9495,GEC_Journal,0,1,1,1,Environmental Sciences,Environmental Studies | Geography,NA,ELSEVIER SCI LTD,2021-09-02 +global environmental politics,1526-3800,1536-0091,gepjournal,0,1,0,1,NA,Environmental Studies | International Relations | Political Science,NA,MIT PRESS,2017-12-04 +global food security-agriculture policy economics and environment,2211-9124,2211-9124,Journal_GFS,0,0,1,1,Food Science & Technology,NA,NA,ELSEVIER,2021-05-27 +global governance,1075-2846,1942-6720,globalgovjrnl,0,1,0,1,NA,International Relations,NA,BRILL,2017-11-14 +global health-science and practice,2169-575X,2169-575X,GHSPJournal,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,JOHNS HOPKINS CENTER COMMUNICATION PROGRAMS-CCP,2012-07-24 +global health-science and practice,2169-575X,2169-575X,GHSPJournal,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,JOHNS HOPKINS CENTER COMMUNICATION PROGRAMS-CCP,2012-07-24 +global health action,1654-9880,1654-9880,GlobalHealthAct,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,2010-06-01 +global health action,1654-9880,1654-9880,GlobalHealthAct,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,2010-06-01 +global health promotion,1757-9759,1757-9767,GHPjournal,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,2014-06-05 +global heart,2211-8160,2211-8179,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,UBIQUITY PRESS LTD,NA +global mental health,2054-4251,2054-4251,NA,0,0,1,0,Psychiatry,NA,NA,CAMBRIDGE UNIV PRESS,NA +global nest journal,1790-7632,1108-4006,NA,0,0,1,0,Environmental Sciences,NA,NA,GLOBAL NETWORK ENVIRONMENTAL SCIENCE & TECHNOLOGY,NA +global networks-a journal of transnational affairs,1470-2266,1471-0374,GlobalNetwrks,0,1,0,1,NA,Anthropology | Geography | Sociology,NA,WILEY,NA +global policy,1758-5880,1758-5899,global_policy,0,1,0,1,NA,International Relations | Political Science,NA,WILEY,2010-03-26 +global public health,1744-1692,1744-1706,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +global spine journal,2192-5682,2192-5690,GlobalSpineJ,0,0,1,1,Clinical Neurology | Orthopedics,NA,NA,SAGE PUBLICATIONS LTD,2013-08-23 +global strategy journal,2042-5791,2042-5805,GSJ_Jour,0,1,0,1,NA,Management,NA,WILEY,2022-01-07 +globalization and health,1744-8603,1744-8603,GHJournal,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,2011-03-24 +globalization and health,1744-8603,1744-8603,GHJournal,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,2011-03-24 +globalizations,1474-7731,1474-774X,globalizationsj,0,1,0,1,NA,"International Relations | Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-06-25 +glossa-a journal of general linguistics,2397-1835,2397-1835,glossa_oa,1,1,0,1,NA,Linguistics,Language & Linguistics,UBIQUITY PRESS LTD,2015-11-04 +glossa-a journal of general linguistics,2397-1835,2397-1835,glossa_oa,1,1,0,1,NA,Linguistics,Language & Linguistics,UBIQUITY PRESS LTD,2015-11-04 +glotta-zeitschrift fur griechische und lateinische sprache,0017-1298,2196-9043,NA,1,0,0,0,NA,NA,Classics,VANDENHOECK & RUPRECHT GMBH & CO KG,NA +glq-a journal of lesbian and gay studies,1064-2684,1527-9375,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,DUKE UNIV PRESS,NA +glycobiology,0959-6658,1460-2423,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,OXFORD UNIV PRESS INC,NA +glycoconjugate journal,0282-0080,1573-4986,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,SPRINGER,NA +gm crops & food-biotechnology in agriculture and the food chain,2164-5698,2164-5701,GMCrops,0,0,1,1,Biotechnology & Applied Microbiology | Plant Sciences,NA,NA,TAYLOR & FRANCIS AS,2012-08-08 +gnomon-kritische zeitschrift fur die gesamte klassische altertumswissenschaft,0017-1417,0017-1417,NA,1,0,0,0,NA,NA,Classics,C H BECKSCHE,NA +goethe jahrbuch,0323-4207,NA,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",HERMANN BOHLAUS NACHFOLGER,NA +gold bulletin,2364-821X,2190-7579,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +gondwana research,1342-937X,1878-0571,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +gorteria,0017-2294,0017-2294,NA,0,0,1,0,Plant Sciences,NA,NA,"NATL HERBARIUM NEDERLAND",NA +gospodarka surowcami mineralnymi-mineral resources management,0860-0953,2299-2324,NA,0,0,1,0,Mineralogy | Mining & Mineral Processing,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES, MINER & ENERGY ECON RES INST PAS",NA +governance-an international journal of policy administration and institutions,0952-1895,1468-0491,Gov_Journal,0,1,0,1,NA,Political Science | Public Administration,NA,WILEY,2010-05-25 +government and opposition,0017-257X,1477-7053,govandopp,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2012-10-09 +government information quarterly,0740-624X,1872-9517,NA,0,1,0,0,NA,Information Science & Library Science,NA,ELSEVIER INC,NA +goya,0017-2715,NA,NA,1,0,0,0,NA,NA,Art,FUNDACION LAZARO GALDIANO,NA +gps solutions,1080-5370,1521-1886,NA,0,0,1,0,Remote Sensing,NA,NA,SPRINGER HEIDELBERG,NA +gradevinar,0350-2465,1333-9095,NA,0,0,1,0,"Engineering, Civil",NA,NA,CROATIAN SOC CIVIL ENGINEERS-HSGI,NA +gradiva,0363-8057,0363-8057,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,CASA EDITRICE LEO S OLSCHKI,NA +graefes archive for clinical and experimental ophthalmology,0721-832X,1435-702X,NA,0,0,1,0,Ophthalmology,NA,NA,SPRINGER,NA +grana,0017-3134,1651-2049,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS AS,NA +granular matter,1434-5021,1434-7636,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics | Physics, Applied",NA,NA,SPRINGER,NA +graphical models,1524-0703,1524-0711,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +graphs and combinatorics,0911-0119,1435-5914,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER JAPAN KK,NA +grasas y aceites,0017-3495,1988-4214,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +grass and forage science,0142-5242,1365-2494,NA,0,0,1,0,Agronomy,NA,NA,WILEY,NA +grassland science,1744-6961,1744-697X,NA,0,0,1,0,"Agriculture, Multidisciplinary | Agronomy",NA,NA,WILEY,NA +gravitation & cosmology,0202-2893,1995-0721,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +great plains quarterly,0275-7664,2333-5092,UNLGPQJournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",CENT GREAT PLAINS STUD,2015-02-17 +greece & rome,0017-3835,1477-4550,NA,1,0,0,0,NA,NA,Classics,CAMBRIDGE UNIV PRESS,NA +greek roman and byzantine studies,0017-3916,2159-3159,NA,1,0,0,0,NA,NA,Classics,DUKE UNIV,NA +green chemistry,1463-9262,1463-9270,green_rsc,0,0,1,1,"Chemistry, Multidisciplinary | Green & Sustainable Science & Technology",NA,NA,ROYAL SOC CHEMISTRY,2016-11-10 +green chemistry letters and reviews,1751-8253,1751-7192,NA,0,0,1,0,"Chemistry, Multidisciplinary | Green & Sustainable Science & Technology",NA,NA,TAYLOR & FRANCIS LTD,NA +green energy & environment,2096-2797,2468-0257,GEE_Journal,0,0,1,1,"Chemistry, Physical | Green & Sustainable Science & Technology | Energy & Fuels | Engineering, Chemical",NA,NA,KEAI PUBLISHING LTD,2017-03-06 +green materials,2049-1220,2049-1239,NA,0,0,1,0,"Green & Sustainable Science & Technology | Materials Science, Multidisciplinary | Polymer Science",NA,NA,ICE PUBLISHING,NA +green processing and synthesis,2191-9542,2191-9550,GREENPS_DG,0,0,1,1,"Chemistry, Multidisciplinary | Green & Sustainable Science & Technology | Engineering, Chemical",NA,NA,WALTER DE GRUYTER GMBH,2021-04-11 +greenhouse gases-science and technology,2152-3878,2152-3878,NA,0,0,1,0,"Energy & Fuels | Engineering, Environmental | Environmental Sciences",NA,NA,"WILEY PERIODICALS, INC",NA +grey room,1526-3819,1536-0105,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",MIT PRESS,NA +grey systems-theory and application,2043-9377,2043-9385,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +gripla,1018-5011,NA,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian | Medieval & Renaissance Studies",ARNI MAGNUSSON INSTITUTE ICELANDIC STUDIES,NA +ground water monitoring and remediation,1069-3629,1745-6592,NA,0,0,1,0,Water Resources,NA,NA,WILEY,NA +groundwater,0017-467X,1745-6584,NA,0,0,1,0,"Geosciences, Multidisciplinary | Water Resources",NA,NA,WILEY,NA +group & organization management,1059-6011,1552-3993,GroupOrgMgmt,0,1,0,1,NA,"Psychology, Applied | Management",NA,SAGE PUBLICATIONS INC,2015-09-28 +group decision and negotiation,0926-2644,1572-9907,NA,0,1,0,0,NA,"Management | Social Sciences, Interdisciplinary",NA,SPRINGER,NA +group dynamics-theory research and practice,1089-2699,1930-7802,NA,0,1,0,0,NA,"Psychology, Social",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +group processes & intergroup relations,1368-4302,1461-7188,NA,0,1,0,0,NA,"Psychology, Social",NA,SAGE PUBLICATIONS LTD,NA +groups geometry and dynamics,1661-7207,1661-7215,NA,0,0,1,0,Mathematics,NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +growth and change,0017-4815,1468-2257,NA,0,1,0,0,NA,Development Studies | Regional & Urban Planning,NA,WILEY,NA +growth factors,0897-7194,1029-2292,NA,0,0,1,0,Cell Biology | Endocrinology & Metabolism,NA,NA,TAYLOR & FRANCIS LTD,NA +growth hormone & igf research,1096-6374,1532-2238,NA,0,0,1,0,Cell Biology | Endocrinology & Metabolism,NA,NA,CHURCHILL LIVINGSTONE,NA +grundwasser,1430-483X,1432-1165,NA,0,0,1,0,Environmental Sciences | Water Resources,NA,NA,SPRINGER HEIDELBERG,NA +gruppenpsychotherapie und gruppendynamik,0017-4947,2196-7989,NA,0,1,0,0,NA,"Psychology, Clinical",NA,VANDENHOECK & RUPRECHT GMBH & CO KG,NA +guerres mondiales et conflits contemporains,0984-2292,2101-0137,NA,1,0,0,0,NA,NA,History,PRESSES UNIV FRANCE,NA +gut,0017-5749,1468-3288,Gut_BMJ,0,0,1,1,Gastroenterology & Hepatology,NA,NA,BMJ PUBLISHING GROUP,2010-05-06 +gut and liver,1976-2283,2005-1212,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,EDITORIAL OFFICE GUT & LIVER,NA +gut microbes,1949-0976,1949-0984,NA,0,0,1,0,Gastroenterology & Hepatology | Microbiology,NA,NA,TAYLOR & FRANCIS INC,NA +gut pathogens,1757-4749,1757-4749,GutPathogens,0,0,1,1,Gastroenterology & Hepatology | Microbiology,NA,NA,BMC,2012-07-24 +gymnasium,0342-5231,2567-6555,NA,1,0,0,0,NA,NA,Classics,UNIVERSITATSVERLAG C WINTER HEIDELBERG GMBH,NA +gynecologic and obstetric investigation,0378-7346,1423-002X,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,KARGER,NA +gynecologic oncology,0090-8258,1095-6859,NA,0,0,1,0,Oncology | Obstetrics & Gynecology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +gynecological endocrinology,0951-3590,1473-0766,NA,0,0,1,0,Endocrinology & Metabolism | Obstetrics & Gynecology,NA,NA,TAYLOR & FRANCIS LTD,NA +gynecologie obstetrique fertilite & senologie,2468-7197,2468-7189,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +habitat international,0197-3975,1873-5428,NA,0,1,0,0,NA,Development Studies | Environmental Studies | Regional & Urban Planning | Urban Studies,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +hacettepe journal of mathematics and statistics,1303-5010,2651-477X,NA,0,0,1,0,Mathematics | Statistics & Probability,NA,NA,"HACETTEPE UNIV, FAC SCI",NA +hacienda publica espanola-review of public economics,0210-1173,2386-4176,NA,0,1,0,0,NA,Economics,NA,INST ESTUDIOS FISCALES,NA +haematologica,0390-6078,1592-8721,Haematologica,0,0,1,1,Hematology,NA,NA,FERRATA STORTI FOUNDATION,2012-05-18 +haemophilia,1351-8216,1365-2516,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +hague journal on the rule of law,1876-4045,1876-4053,NA,0,1,0,0,NA,Law,NA,SPRINGER WIEN,NA +hahr-hispanic american historical review,0018-2168,1527-1900,HAHR21,1,1,0,1,NA,History,History,DUKE UNIV PRESS,2012-10-01 +hahr-hispanic american historical review,0018-2168,1527-1900,HAHR21,1,1,0,1,NA,History,History,DUKE UNIV PRESS,2012-10-01 +hamostaseologie,0720-9355,2567-5761,NA,0,0,1,0,Hematology,NA,NA,GEORG THIEME VERLAG KG,NA +hand clinics,0749-0712,1558-1969,NA,0,0,1,0,Orthopedics,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +hand surgery & rehabilitation,2468-1229,2468-1210,NA,0,0,1,0,Orthopedics | Surgery,NA,NA,ELSEVIER,NA +handchirurgie mikrochirurgie plastische chirurgie,0722-1819,1439-3980,NA,0,0,1,0,Surgery,NA,NA,THIEME MEDICAL PUBL INC,NA +harm reduction journal,1477-7517,1477-7517,NA,0,1,0,0,NA,Substance Abuse,NA,BMC,NA +harmful algae,1568-9883,1878-1470,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,ELSEVIER,NA +harvard business review,0017-8012,0017-8012,HarvardBiz,0,1,0,1,NA,Business | Management,NA,HARVARD BUSINESS SCHOOL PUBLISHING CORPORATION,2008-05-16 +harvard civil rights-civil liberties law review,0017-8039,1943-5061,HarvardCRCL,0,1,0,1,NA,Law,NA,HARVARD LAW SCHOOL,2010-11-11 +harvard educational review,0017-8055,1943-5045,NA,0,1,0,0,NA,Education & Educational Research,NA,HARVARD GRADUATE SCHOOL EDUCATION,NA +harvard environmental law review,0147-8257,NA,harvardelr,0,1,0,1,NA,Environmental Studies | Law,NA,HARVARD LAW SCHOOL,2013-10-09 +harvard international law journal,0017-8063,2153-2494,HarvardILJ,0,1,0,1,NA,Law,NA,HARVARD LAW SCHOOL,2014-03-05 +harvard journal of asiatic studies,0073-0548,1944-6454,NA,1,0,0,0,NA,NA,History | Asian Studies,HARVARD-YENCHING INST,NA +harvard journal of law and public policy,0193-4872,0193-4872,HarvardJLPP,0,1,0,1,NA,Law,NA,HARVARD SOC LAW PUBLIC POLICY,2011-04-27 +harvard journal on legislation,0017-808X,1943-507X,HarvardJOL,0,1,0,1,NA,Law,NA,HARVARD LAW SCHOOL,2014-02-19 +harvard law review,0017-811X,2161-976X,harvlrev,0,1,0,1,NA,Law,NA,HARVARD LAW REV ASSOC,2009-04-06 +harvard library bulletin,0017-8136,NA,HLBJournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",HARVARD UNIV LIBRARY,2020-08-18 +harvard review of psychiatry,1067-3229,1465-7309,HarvardRevPsych,0,1,1,1,Psychiatry,Psychiatry,NA,LIPPINCOTT WILLIAMS & WILKINS,2015-08-10 +harvard review of psychiatry,1067-3229,1465-7309,HarvardRevPsych,0,1,1,1,Psychiatry,Psychiatry,NA,LIPPINCOTT WILLIAMS & WILKINS,2015-08-10 +harvard studies in classical philology,0073-0688,NA,NA,1,0,0,0,NA,NA,Classics,HARVARD UNIV PRESS,NA +harvard theological review,0017-8160,1475-4517,NA,1,0,0,0,NA,NA,Religion,CAMBRIDGE UNIV PRESS,NA +haseltonia,1070-0048,1938-2898,NA,0,0,1,0,Plant Sciences,NA,NA,CACTUS SUCCULENT SOC AMER INC,NA +hastings center report,0093-0334,1552-146X,NA,0,1,1,0,Health Care Sciences & Services | Medical Ethics,"Ethics | Social Sciences, Biomedical",NA,WILEY,NA +hastings center report,0093-0334,1552-146X,NA,0,1,1,0,Health Care Sciences & Services | Medical Ethics,"Ethics | Social Sciences, Biomedical",NA,WILEY,NA +hastings law journal,0017-8322,0017-8322,hastingslj,0,1,0,1,NA,Law,NA,UNIV CALIF,2013-03-26 +hau-journal of ethnographic theory,2575-1433,2049-1115,haujournal,0,1,0,1,NA,Anthropology,NA,UNIV CHICAGO PRESS,2011-05-18 +hautarzt,0017-8470,1432-1173,NA,0,0,1,0,Dermatology,NA,NA,SPRINGER HEIDELBERG,NA +head & face medicine,1746-160X,1746-160X,HeadFaceMed,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,BMC,2009-06-11 +head and neck-journal for the sciences and specialties of the head and neck,1043-3074,1097-0347,NA,0,0,1,0,Otorhinolaryngology | Surgery,NA,NA,WILEY,NA +headache,0017-8748,1526-4610,HeadacheJournal,0,0,1,1,Clinical Neurology,NA,NA,WILEY,2013-04-19 +health,1363-4593,1461-7196,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,SAGE PUBLICATIONS LTD,NA +health & place,1353-8292,1873-2054,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,NA +health & place,1353-8292,1873-2054,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,NA +health & social care in the community,0966-0410,1365-2524,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Social Work",NA,WILEY,NA +health & social work,0360-7283,1545-6854,NA,0,1,0,0,NA,Social Work,NA,OXFORD UNIV PRESS INC,NA +health affairs,0278-2715,0278-2715,Health_Affairs,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,PROJECT HOPE,2008-06-25 +health affairs,0278-2715,0278-2715,Health_Affairs,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,PROJECT HOPE,2008-06-25 +health and human rights,1079-0969,2150-4113,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,HARVARD UNIV PRESS,NA +health and quality of life outcomes,1477-7525,1477-7525,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,BMC,NA +health and quality of life outcomes,1477-7525,1477-7525,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,BMC,NA +health care analysis,1065-3058,1573-3394,HCAnalysis,0,1,0,1,NA,"Ethics | Health Policy & Services | Social Sciences, Biomedical",NA,SPRINGER,2018-02-16 +health care for women international,0739-9332,1096-4665,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Women'S Studies",NA,TAYLOR & FRANCIS INC,NA +health care management review,0361-6274,1550-5030,HCMRonline,0,1,0,1,NA,Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-03 +health care management science,1386-9620,1572-9389,NA,0,1,0,0,NA,Health Policy & Services,NA,SPRINGER,NA +health communication,1041-0236,1532-7027,hceditorialteam,0,1,0,1,NA,Communication | Health Policy & Services,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-12 +health economics,1057-9230,1099-1050,NA,0,1,1,0,Health Care Sciences & Services,Economics | Health Policy & Services,NA,WILEY,NA +health economics,1057-9230,1099-1050,NA,0,1,1,0,Health Care Sciences & Services,Economics | Health Policy & Services,NA,WILEY,NA +health economics policy and law,1744-1331,1744-134X,NA,0,1,0,0,NA,Health Policy & Services,NA,CAMBRIDGE UNIV PRESS,NA +health economics review,2191-1991,2191-1991,NA,0,1,0,0,NA,Economics | Health Policy & Services,NA,BMC,NA +health education & behavior,1090-1981,1552-6127,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +health education journal,0017-8969,1748-8176,NA,0,1,0,0,NA,"Education & Educational Research | Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS LTD,NA +health education research,0268-1153,1465-3648,NA,0,1,0,0,NA,"Education & Educational Research | Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +health expectations,1369-6513,1369-7625,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,WILEY,NA +health expectations,1369-6513,1369-7625,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,WILEY,NA +health informatics journal,1460-4582,1741-2811,Health_Inf_J,0,0,1,1,Health Care Sciences & Services | Medical Informatics,NA,NA,SAGE PUBLICATIONS INC,2018-09-29 +health information and libraries journal,1471-1834,1471-1842,NA,0,1,0,0,NA,Information Science & Library Science,NA,WILEY,NA +health information management journal,1833-3583,1833-3575,NA,0,1,1,0,Medical Informatics,Health Policy & Services,NA,SAGE PUBLICATIONS INC,NA +health information management journal,1833-3583,1833-3575,NA,0,1,1,0,Medical Informatics,Health Policy & Services,NA,SAGE PUBLICATIONS INC,NA +health physics,0017-9078,1538-5159,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health | Nuclear Science & Technology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +health policy,0168-8510,1872-6054,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,ELSEVIER IRELAND LTD,NA +health policy,0168-8510,1872-6054,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,ELSEVIER IRELAND LTD,NA +health policy and planning,0268-1080,1460-2237,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,OXFORD UNIV PRESS,NA +health policy and planning,0268-1080,1460-2237,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,OXFORD UNIV PRESS,NA +health policy and technology,2211-8837,2211-8845,NA,0,1,0,0,NA,Health Policy & Services,NA,ELSEVIER SCI LTD,NA +health promotion and chronic disease prevention in canada-research policy and practice,2368-738X,2368-738X,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,PUBLIC HEALTH AGENCY CANADA,NA +health promotion international,0957-4824,1460-2245,HealthPromInt,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,OXFORD UNIV PRESS,2013-02-24 +health promotion international,0957-4824,1460-2245,HealthPromInt,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,OXFORD UNIV PRESS,2013-02-24 +health promotion journal of australia,1036-1073,2201-1617,HealthProm_J_Au,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,WILEY,2014-02-05 +health psychology,0278-6133,1930-7810,NA,0,1,1,0,Psychology,"Psychology, Clinical",NA,AMER PSYCHOLOGICAL ASSOC,NA +health psychology,0278-6133,1930-7810,NA,0,1,1,0,Psychology,"Psychology, Clinical",NA,AMER PSYCHOLOGICAL ASSOC,NA +health psychology review,1743-7199,1743-7202,healthpsychrev,0,1,0,1,NA,"Psychology, Clinical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-06-30 +health reports,0840-6529,1209-1367,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,STATISTICS CANADA,NA +health reports,0840-6529,1209-1367,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,STATISTICS CANADA,NA +health research policy and systems,1478-4505,1478-4505,HarpsJournal,0,1,0,1,NA,Health Policy & Services,NA,BMC,2017-10-05 +health risk & society,1369-8575,1469-8331,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +health security,2326-5094,2326-5108,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,"MARY ANN LIEBERT, INC",NA +health services research,0017-9124,1475-6773,HSR_HRET,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,WILEY,2014-01-14 +health services research,0017-9124,1475-6773,HSR_HRET,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,WILEY,2014-01-14 +health sociology review,1446-1242,1839-3551,healthsocrev,0,1,0,1,NA,Health Policy & Services | Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-02-17 +health systems & reform,2328-8604,2328-8620,HSRJournal,0,1,0,1,NA,"Health Policy & Services | Public, Environmental & Occupational Health",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-05-30 +health technology assessment,1366-5278,2046-4924,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,NIHR JOURNALS LIBRARY,NA +healthcare,2227-9032,2227-9032,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,MDPI,NA +healthcare,2227-9032,2227-9032,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,MDPI,NA +healthcare-the journal of delivery science and innovation,2213-0764,2213-0772,HC_TheJournal,0,1,0,1,NA,Health Policy & Services,NA,ELSEVIER,2013-02-14 +hearing research,0378-5955,1878-5891,NA,0,0,1,0,Audiology & Speech-Language Pathology | Neurosciences | Otorhinolaryngology,NA,NA,ELSEVIER,NA +heart,1355-6037,1468-201X,Heart_BMJ,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,BMJ PUBLISHING GROUP,2009-05-22 +heart & lung,0147-9563,1527-3288,haljournal,0,0,1,1,Cardiac & Cardiovascular System | Nursing | Respiratory System,NA,NA,MOSBY-ELSEVIER,2018-08-03 +heart and vessels,0910-8327,1615-2573,NA,0,0,1,0,Cardiac & Cardiovascular System | Peripheral Vascular Diseases,NA,NA,SPRINGER,NA +heart failure clinics,1551-7136,NA,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCIENCE INC,NA +heart failure reviews,1382-4147,1573-7322,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,SPRINGER,NA +heart lung and circulation,1443-9506,1444-2892,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCIENCE INC,NA +heart rhythm,1547-5271,1556-3871,HRS_O2Journal,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCIENCE INC,2020-01-23 +heart surgery forum,1098-3511,1522-6662,NA,0,0,1,0,Cardiac & Cardiovascular System | Surgery,NA,NA,"FORUM MULTIMEDIA PUBLISHING, LLC",NA +heat and mass transfer,0947-7411,1432-1181,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,SPRINGER,NA +heat transfer engineering,0145-7632,1521-0537,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical | Mechanics",NA,NA,TAYLOR & FRANCIS INC,NA +heat transfer research,1064-2285,2162-6561,NA,0,0,1,0,Thermodynamics,NA,NA,BEGELL HOUSE INC,NA +hec forum,0956-2737,1572-8498,NA,0,1,0,0,NA,Ethics,NA,SPRINGER,NA +hegel-studien,0073-1587,NA,NA,1,0,0,0,NA,NA,Philosophy,FELIX MEINER VERLAG,NA +helgoland marine research,1438-387X,1438-3888,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,BMC,NA +helicobacter,1083-4389,1523-5378,HelicoJournal,0,0,1,1,Gastroenterology & Hepatology | Microbiology,NA,NA,WILEY,2018-09-21 +helios,0160-0923,1935-0228,NA,1,0,0,0,NA,NA,Classics,TEXAS TECH UNIV PRESS,NA +heliyon,2405-8440,2405-8440,HeliyonJournal,0,0,1,1,Multidisciplinary Sciences,NA,NA,ELSEVIER SCI LTD,2015-02-04 +hellenic journal of cardiology,1109-9666,2241-5955,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,HELLENIC CARDIOLOGICAL SOC,NA +hellenic journal of nuclear medicine,1790-5427,NA,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,HELLENIC SOC NUCLEAR MEDICINE,NA +helminthologia,0440-6605,1336-9083,NA,0,0,1,0,Parasitology | Zoology,NA,NA,SCIENDO,NA +helvetica chimica acta,0018-019X,1522-2675,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +hemasphere,2572-9241,2572-9241,Hemasphere_EHA,0,0,1,1,Hematology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2020-05-06 +hematological oncology,0278-0232,1099-1069,NA,0,0,1,0,Oncology | Hematology,NA,NA,WILEY,NA +hematology,1024-5332,1607-8454,NA,0,0,1,0,Hematology,NA,NA,TAYLOR & FRANCIS LTD,NA +hematology-american society of hematology education program,1520-4391,1520-4383,NA,0,0,1,0,"Education, Scientific Disciplines | Hematology",NA,NA,AMER SOC HEMATOLOGY,NA +hematology-oncology clinics of north america,0889-8588,1558-1977,NA,0,0,1,0,Oncology | Hematology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +hemijska industrija,0367-598X,2217-7426,NA,0,0,1,0,"Engineering, Chemical",NA,NA,ASSOC CHEMICAL ENGINEERS SERBIA,NA +hemodialysis international,1492-7535,1542-4758,NA,0,0,1,0,Urology & Nephrology,NA,NA,WILEY,NA +hemoglobin,0363-0269,1532-432X,NA,0,0,1,0,Biochemistry & Molecular Biology | Hematology,NA,NA,TAYLOR & FRANCIS LTD,NA +henry james review,0273-0340,1080-6555,NA,1,0,0,0,NA,NA,"Literature, British Isles",JOHNS HOPKINS UNIV PRESS,NA +hepatitis monthly,1735-143X,1735-3408,Hepatmon,0,0,1,1,Gastroenterology & Hepatology,NA,NA,KOWSAR PUBL,2021-02-26 +hepatobiliary & pancreatic diseases international,1499-3872,2352-9377,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,ELSEVIER,NA +hepatobiliary surgery and nutrition,2304-3881,2304-389X,HepatobiliaryN,0,0,1,1,Gastroenterology & Hepatology | Nutrition & Dietetics | Surgery,NA,NA,AME PUBL CO,2019-06-17 +hepatology,0270-9139,1527-3350,HEP_Journal,0,0,1,1,Gastroenterology & Hepatology,NA,NA,WILEY,2014-10-23 +hepatology communications,2471-254X,2471-254X,HepCommJournal,0,0,1,1,Gastroenterology & Hepatology,NA,NA,JOHN WILEY & SONS LTD,2019-04-04 +hepatology international,1936-0533,1936-0541,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,SPRINGER,NA +hepatology research,1386-6346,1872-034X,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,WILEY,NA +herald of the russian academy of sciences,1019-3316,1555-6492,NA,0,0,1,0,History & Philosophy Of Science | Multidisciplinary Sciences,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +herd-health environments research & design journal,1937-5867,2167-5112,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +hereditary cancer in clinical practice,1731-2302,1897-4287,NA,0,0,1,0,Oncology,NA,NA,BMC,NA +hereditas,1601-5223,1601-5223,NA,0,0,1,0,Genetics & Heredity,NA,NA,BMC,NA +heredity,0018-067X,1365-2540,HeredityJournal,0,0,1,1,Ecology | Evolutionary Biology | Genetics & Heredity,NA,NA,SPRINGERNATURE,2013-09-27 +heritage science,2050-7445,2050-7445,NA,1,0,1,0,"Chemistry, Analytical | Materials Science, Multidisciplinary | Spectroscopy",NA,"Humanities, Multidisciplinary",SPRINGER,NA +heritage science,2050-7445,2050-7445,NA,1,0,1,0,"Chemistry, Analytical | Materials Science, Multidisciplinary | Spectroscopy",NA,"Humanities, Multidisciplinary",SPRINGER,NA +hermathena,0018-0750,NA,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",TRINITY COLLEGE,NA +hermes-zeitschrift fur klassische philologie,0018-0777,2365-3116,NA,1,0,0,0,NA,NA,Classics,FRANZ STEINER VERLAG GMBH,NA +hernia,1265-4906,1248-9204,hernia_journal,0,0,1,1,Surgery,NA,NA,SPRINGER,2018-03-22 +heroin addiction and related clinical problems,1592-1638,1592-1638,NA,0,1,0,0,NA,Substance Abuse,NA,PACINI EDITORE,NA +herpetologica,0018-0831,1938-5099,NA,0,0,1,0,Zoology,NA,NA,HERPETOLOGISTS LEAGUE,NA +herpetological conservation and biology,2151-0733,1931-7603,Herpconbio,0,0,1,1,Zoology,NA,NA,HERPETOLOGICAL CONSERVATION & BIOLOGY,2009-02-04 +herpetological journal,0268-0130,0268-0130,HerpJournal,0,0,1,1,Zoology,NA,NA,BRITISH HERPETOL SOC,2019-10-26 +herpetological monographs,0733-1347,1938-5137,NA,0,0,1,0,Zoology,NA,NA,HERPETOLOGISTS LEAGUE,NA +herpetozoa,1013-4425,1013-4425,herpetozoa,0,0,1,1,Zoology,NA,NA,PENSOFT PUBLISHERS,2019-05-09 +herz,0340-9937,1615-6692,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,URBAN & VOGEL,NA +herzogia,0018-0971,NA,NA,0,0,1,0,Plant Sciences,NA,NA,BLAM E V,NA +hesperia,0018-098X,1553-5622,NA,1,0,0,0,NA,NA,Archaeology,AMER SCHOOL CLASSICAL STUDIES AT ATHENS,NA +heteroatom chemistry,1042-7163,1098-1071,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-HINDAWI,NA +heterocycles,0385-5414,1881-0942,NA,0,0,1,0,"Chemistry, Organic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +heterocyclic communications,0793-0283,2191-0197,NA,0,0,1,0,"Chemistry, Organic",NA,NA,WALTER DE GRUYTER GMBH,NA +heythrop journal,0018-1196,1468-2265,NA,1,0,0,0,NA,NA,Philosophy | Religion,WILEY,NA +hidrobiologica,0188-8897,0188-8897,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,UNIV AUTONOMA METROPOLITANA-IZTAPALAPA,NA +high ability studies,1359-8139,1469-834X,NA,0,1,0,0,NA,"Education, Special | Psychology, Educational",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +high altitude medicine & biology,1527-0297,1557-8682,NA,0,0,1,0,"Biophysics | Public, Environmental & Occupational Health | Sport Sciences",NA,NA,"MARY ANN LIEBERT, INC",NA +high energy chemistry,0018-1439,1608-3148,NA,0,0,1,0,"Chemistry, Physical",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +high energy density physics,1574-1818,1878-0563,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,ELSEVIER,NA +high performance polymers,0954-0083,1361-6412,NA,0,0,1,0,Polymer Science,NA,NA,SAGE PUBLICATIONS LTD,NA +high power laser science and engineering,2095-4719,2052-3289,NA,0,0,1,0,Optics,NA,NA,CHINESE LASER PRESS & CAMBRIDGE UNIV PRESS,NA +high pressure research,0895-7959,1477-2299,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +high temperature,0018-151X,1608-3156,NA,0,0,1,0,"Physics, Applied",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +high temperature materials and processes,0334-6455,2191-0324,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,WALTER DE GRUYTER GMBH,NA +high temperatures-high pressures,0018-1544,1472-3441,NA,0,0,1,0,"Thermodynamics | Mechanics | Materials Science, Characterization, Testing",NA,NA,OLD CITY PUBLISHING INC,NA +high voltage,2397-7264,2397-7264,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +higher education,0018-1560,1573-174X,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +higher education policy,0952-8733,1740-3863,NA,0,1,0,0,NA,Education & Educational Research,NA,PALGRAVE MACMILLAN LTD,NA +higher education research & development,0729-4360,1469-8366,HERDJournal,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-07-02 +himalayan geology,0971-8966,NA,NA,0,0,1,0,Geology,NA,NA,WADIA INST HIMALAYAN GEOLOGY,NA +hip international,1120-7000,1724-6067,NA,0,0,1,0,Orthopedics,NA,NA,SAGE PUBLICATIONS LTD,NA +hippocampus,1050-9631,1098-1063,NA,0,0,1,0,Neurosciences,NA,NA,WILEY,NA +hippokratia,1108-4189,1108-4189,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,LITHOGRAPHIA,NA +hiroshima mathematical journal,0018-2079,0018-2079,NA,0,0,1,0,Mathematics,NA,NA,"HIROSHIMA UNIV, GRAD SCH SCI",NA +hispamerica-revista de literatura,0363-0471,NA,NA,1,0,0,0,NA,NA,"Literature, Romance",HISPAMERICA,NA +hispania-a journal devoted to the teaching of spanish and portuguese,0018-2133,2153-6414,NA,1,1,0,0,NA,Linguistics,"Language & Linguistics | Literature, Romance","AMER ASSOC TEACHERS SPANISH PORTUGUESE, INC",NA +hispania-a journal devoted to the teaching of spanish and portuguese,0018-2133,2153-6414,NA,1,1,0,0,NA,Linguistics,"Language & Linguistics | Literature, Romance","AMER ASSOC TEACHERS SPANISH PORTUGUESE, INC",NA +hispania-revista espanola de historia,0018-2141,1988-8368,NA,1,0,0,0,NA,NA,History,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +hispania sacra,0018-215X,1988-4265,NA,1,0,0,0,NA,NA,Religion | History,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +hispanic journal of behavioral sciences,0739-9863,1552-6364,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +hispanic research journal-iberian and latin american studies,1468-2737,1745-820X,JournalHispanic,1,0,0,1,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-01-14 +hispanic review,0018-2176,1553-0639,NA,1,0,0,0,NA,NA,"Literature, Romance",UNIV PENNSYLVANIA PRESS,NA +hispanofila,0018-2206,2165-6185,NA,1,0,0,0,NA,NA,"Literature, Romance",UNIV NORTH CAROLINA,NA +histochemistry and cell biology,0948-6143,1432-119X,NA,0,0,1,0,Cell Biology | Microscopy,NA,NA,SPRINGER,NA +histoire sociale-social history,0018-2257,0018-2257,Sociale_History,1,0,0,1,NA,NA,History,HISTOIRE SOCIALE DEPT HISTORY,2014-05-27 +histology and histopathology,0213-3911,1699-5848,NA,0,0,1,0,Cell Biology | Pathology,NA,NA,F HERNANDEZ,NA +histopathology,0309-0167,1365-2559,Histo_Journal,0,0,1,1,Cell Biology | Pathology,NA,NA,WILEY,2017-12-15 +historia,1270-0835,NA,NA,1,0,0,0,NA,NA,History,SOPHIA PUBLICATIONS,NA +historia-santiago,0717-7194,0717-7194,NA,1,0,0,0,NA,NA,History,"PONTIFICA UNIV CATOLICA CHILE, INST HISTORIA",NA +historia-zeitschrift fur alte geschichte,0018-2311,0018-2311,NA,1,0,0,0,NA,NA,History,FRANZ STEINER VERLAG GMBH,NA +historia agraria,1139-1472,2340-3659,HistoriaAgraria,1,1,0,1,NA,History,History,UNIV MURCIA,2022-02-19 +historia agraria,1139-1472,2340-3659,HistoriaAgraria,1,1,0,1,NA,History,History,UNIV MURCIA,2022-02-19 +historia ciencias saude-manguinhos,0104-5970,1678-4758,revistaHCSM,1,0,0,1,NA,NA,History & Philosophy Of Science,FUNDACO OSWALDO CRUZ,2012-11-13 +historia critica,0121-1617,1900-6152,NA,1,1,0,0,NA,History,History,UNIV ANDES,NA +historia critica,0121-1617,1900-6152,NA,1,1,0,0,NA,History,History,UNIV ANDES,NA +historia mathematica,0315-0860,1090-249X,NA,1,1,1,0,"History & Philosophy Of Science | Mathematics, Interdisciplinary Applications | Mathematics",History & Philosophy Of Science,History & Philosophy Of Science,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +historia mathematica,0315-0860,1090-249X,NA,1,1,1,0,"History & Philosophy Of Science | Mathematics, Interdisciplinary Applications | Mathematics",History & Philosophy Of Science,History & Philosophy Of Science,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +historia mathematica,0315-0860,1090-249X,NA,1,1,1,0,"History & Philosophy Of Science | Mathematics, Interdisciplinary Applications | Mathematics",History & Philosophy Of Science,History & Philosophy Of Science,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +historia mexicana,0185-0172,2448-6531,RHisto_Mex,1,0,0,1,NA,NA,History,COLEGIO DE MEXICO CENTRO DE ESTUDIOS HISTORICOS,2019-01-25 +historia unisinos,1519-3861,2236-1782,NA,1,0,0,0,NA,NA,History,UNIV DO VALE DO RIO DOS SINOS,NA +historia y comunicacion social,1137-0734,1988-3056,NA,1,0,0,0,NA,NA,"History | Film, Radio, Television","UNIV COMPLUTENSE MADRID, SERVICIO PUBLICACIONES",NA +historia y politica,1575-0361,1989-063X,historiaypol,1,1,0,1,NA,History | Political Science,History,CENTRO ESTUDIOS POLITICOS CONSTITUCIONALES,2016-12-20 +historia y politica,1575-0361,1989-063X,historiaypol,1,1,0,1,NA,History | Political Science,History,CENTRO ESTUDIOS POLITICOS CONSTITUCIONALES,2016-12-20 +historian,0018-2370,1540-6563,NA,1,0,0,0,NA,NA,History,TAYLOR & FRANCIS INC,NA +historic environment-policy & practice,1756-7505,1756-7513,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +historical archaeology,0440-9213,2328-1103,NA,1,0,0,0,NA,NA,Archaeology,SPRINGER,NA +historical biology,0891-2963,1029-2381,NA,0,0,1,0,Paleontology,NA,NA,TAYLOR & FRANCIS LTD,NA +historical journal,0018-246X,1469-5103,historicaljnl,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2018-10-04 +historical journal,0018-246X,1469-5103,historicaljnl,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2018-10-04 +historical journal of film radio and television,0143-9685,1465-3451,NA,1,0,0,0,NA,NA,"Film, Radio, Television","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +historical materialism-research in critical marxist theory,1465-4466,1569-206X,histmat,1,1,0,1,NA,Political Science,Philosophy,BRILL,2012-10-30 +historical materialism-research in critical marxist theory,1465-4466,1569-206X,histmat,1,1,0,1,NA,Political Science,Philosophy,BRILL,2012-10-30 +historical methods,0161-5440,1940-1906,histmethod,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-02-23 +historical methods,0161-5440,1940-1906,histmethod,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-02-23 +historical records of australian science,0727-3061,1448-5508,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,CSIRO PUBLISHING,NA +historical records of australian science,0727-3061,1448-5508,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,CSIRO PUBLISHING,NA +historical reflections-reflexions historiques,0315-7997,1939-2419,NA,1,0,0,0,NA,NA,History,BERGHAHN JOURNALS,NA +historical research,0950-3471,1468-2281,NA,1,0,0,0,NA,NA,History,OXFORD UNIV PRESS,NA +historical review-la revue historique,1790-3572,1791-7603,NA,1,0,0,0,NA,NA,History,"NATL HELLENIC RES FOUNDATION",NA +historical social research-historische sozialforschung,0172-6404,NA,NA,0,1,0,0,NA,"History | History Of Social Sciences | Social Sciences, Interdisciplinary",NA,GESIS LEIBNIZ INST SOCIAL SCIENCES,NA +historical studies in the natural sciences,1939-1811,1939-182X,HSNatSci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CALIFORNIA PRESS,2019-07-25 +historical studies in the natural sciences,1939-1811,1939-182X,HSNatSci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CALIFORNIA PRESS,2019-07-25 +historical studies in the natural sciences,1939-1811,1939-182X,HSNatSci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CALIFORNIA PRESS,2019-07-25 +historicky casopis,0018-2575,0018-2575,NA,1,0,0,0,NA,NA,History,HISTORICKY USTAV SAV,NA +historiographia linguistica,0302-5160,1569-9781,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +historiographia linguistica,0302-5160,1569-9781,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +historische zeitschrift,0018-2613,2196-680X,NA,1,0,0,0,NA,NA,History,WALTER DE GRUYTER GMBH,NA +historisches jahrbuch,0018-2621,NA,NA,1,0,0,0,NA,NA,History,VERLAG KARL ALBER,NA +historisk tidskrift,0345-469X,NA,editorHT,1,0,0,1,NA,NA,History,SVENSKA HISTORISKA FORENINGEN,2021-09-15 +historisk tidsskrift,0018-263X,1504-2944,NA,1,0,0,0,NA,NA,History,UNIVERSITETSFORLAGET A S,NA +history,0018-2648,1468-229X,HisJournalHA,1,0,0,1,NA,NA,History,WILEY,2018-11-22 +history & memory,0935-560X,1527-1994,NA,1,0,0,0,NA,NA,History,INDIANA UNIV PRESS,NA +history and anthropology,0275-7206,1477-2612,NA,1,1,0,0,NA,History | Anthropology,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +history and anthropology,0275-7206,1477-2612,NA,1,1,0,0,NA,History | Anthropology,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +history and philosophy of logic,0144-5340,1464-5149,NA,1,0,1,0,History & Philosophy Of Science | Logic,NA,History & Philosophy Of Science | Philosophy,TAYLOR & FRANCIS LTD,NA +history and philosophy of logic,0144-5340,1464-5149,NA,1,0,1,0,History & Philosophy Of Science | Logic,NA,History & Philosophy Of Science | Philosophy,TAYLOR & FRANCIS LTD,NA +history and philosophy of the life sciences,0391-9714,1742-6316,HPLSjournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER INT PUBL AG,2019-01-09 +history and philosophy of the life sciences,0391-9714,1742-6316,HPLSjournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER INT PUBL AG,2019-01-09 +history and philosophy of the life sciences,0391-9714,1742-6316,HPLSjournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER INT PUBL AG,2019-01-09 +history and technology,0734-1512,1477-2620,HistAndTech,1,0,0,1,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-05-30 +history and theory,0018-2656,1468-2303,histandtheojrnl,1,1,0,1,NA,History,History,WILEY,2019-02-05 +history and theory,0018-2656,1468-2303,histandtheojrnl,1,1,0,1,NA,History,History,WILEY,2019-02-05 +history of education,0046-760X,1464-5130,NA,0,1,0,0,NA,Education & Educational Research | History Of Social Sciences,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +history of education & childrens literature,1971-1093,1971-1131,NA,1,0,0,0,NA,NA,History,EDIZIONI UNIVERSITA MACERATA,NA +history of european ideas,0191-6599,1873-541X,NA,1,0,0,0,NA,NA,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +history of geo- and space sciences,2190-5010,2190-5029,NA,0,1,1,0,"Geosciences, Multidisciplinary | History & Philosophy Of Science",History & Philosophy Of Science,NA,COPERNICUS GESELLSCHAFT MBH,NA +history of geo- and space sciences,2190-5010,2190-5029,NA,0,1,1,0,"Geosciences, Multidisciplinary | History & Philosophy Of Science",History & Philosophy Of Science,NA,COPERNICUS GESELLSCHAFT MBH,NA +history of photography,0308-7298,2150-7295,HoP_Journal,1,0,0,1,NA,NA,Art,TAYLOR & FRANCIS LTD,2020-05-18 +history of political economy,0018-2702,1527-1919,NA,0,1,0,0,NA,Economics | History Of Social Sciences,NA,DUKE UNIV PRESS,NA +history of political thought,0143-781X,2051-2988,NA,1,0,0,0,NA,NA,History,IMPRINT ACADEMIC,NA +history of psychiatry,0957-154X,1740-2360,NA,0,1,0,0,NA,History Of Social Sciences | Psychiatry,NA,SAGE PUBLICATIONS LTD,NA +history of psychology,1093-4510,1939-0610,NA,0,1,0,0,NA,"History Of Social Sciences | Psychology, Multidisciplinary",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +history of religions,0018-2710,1545-6935,NA,1,0,0,0,NA,NA,Religion | History,UNIV CHICAGO PRESS,NA +history of science,0073-2753,1753-8564,HistorSci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2015-02-04 +history of science,0073-2753,1753-8564,HistorSci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2015-02-04 +history of science,0073-2753,1753-8564,HistorSci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2015-02-04 +history of the family,1081-602X,1873-5398,hisfam_journal,0,1,0,1,NA,Family Studies | History Of Social Sciences,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-08-24 +history of the human sciences,0952-6951,1461-720X,HistHum,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science | History Of Social Sciences,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2014-06-27 +history of the human sciences,0952-6951,1461-720X,HistHum,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science | History Of Social Sciences,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2014-06-27 +history of the human sciences,0952-6951,1461-720X,HistHum,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science | History Of Social Sciences,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2014-06-27 +history today,0018-2753,NA,HistoryToday,1,0,0,1,NA,NA,History,HISTORY TODAY LTD,2008-07-23 +history workshop journal,1363-3554,1477-4569,historywo,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2011-08-16 +history workshop journal,1363-3554,1477-4569,historywo,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2011-08-16 +hitotsubashi journal of economics,0018-280X,0018-280X,NA,0,1,0,0,NA,Economics,NA,HITOTSUBASHI UNIV,NA +hiv medicine,1464-2662,1468-1293,HIV_Medicine,0,0,1,1,Infectious Diseases,NA,NA,WILEY,2017-09-28 +hiv research & clinical practice,2578-7489,2578-7470,NA,0,0,1,0,Infectious Diseases | Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +hla,2059-2302,2059-2310,NA,0,0,1,0,Cell Biology | Immunology | Pathology,NA,NA,WILEY,NA +hno,0017-6192,1433-0458,NA,0,0,1,0,Otorhinolaryngology,NA,NA,SPRINGER,NA +hokkaido mathematical journal,0385-4035,NA,NA,0,0,1,0,Mathematics,NA,NA,"HOKKAIDO UNIV, DEPT MATHEMATICS",NA +holistic nursing practice,0887-9311,1550-5138,NA,0,1,1,0,Integrative & Complementary Medicine | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +holistic nursing practice,0887-9311,1550-5138,NA,0,1,1,0,Integrative & Complementary Medicine | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +holocaust and genocide studies,8756-6583,1476-7937,NA,1,0,0,0,NA,NA,History,OXFORD UNIV PRESS INC,NA +holocene,0959-6836,1477-0911,HoloceneJ,0,0,1,1,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,SAGE PUBLICATIONS LTD,2015-04-16 +holzforschung,0018-3830,1437-434X,NA,0,0,1,0,"Forestry | Materials Science, Paper & Wood",NA,NA,WALTER DE GRUYTER GMBH,NA +home cultures,1740-6315,1751-7427,NA,1,0,0,0,NA,NA,Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +homeopathy,1475-4916,1476-4245,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,THIEME MEDICAL PUBL INC,NA +homicide studies,1088-7679,1552-6720,HomicideStudies,0,1,0,1,NA,Criminology & Penology,NA,SAGE PUBLICATIONS INC,2021-05-24 +homo-journal of comparative human biology,0018-442X,1618-1301,NA,0,1,0,0,NA,Anthropology,NA,ELSEVIER GMBH,NA +homology homotopy and applications,1532-0073,1532-0081,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,"INT PRESS BOSTON, INC",NA +hong kong journal of dermatology & venereology,1814-7453,1814-7453,NA,0,0,1,0,Dermatology,NA,NA,MEDCOM LTD,NA +hong kong journal of emergency medicine,1024-9079,2309-5407,NA,0,0,1,0,Emergency Medicine,NA,NA,SAGE PUBLICATIONS LTD,NA +hong kong journal of occupational therapy,1569-1861,1876-4398,NA,0,0,1,0,Rehabilitation,NA,NA,SAGE PUBLICATIONS LTD,NA +hong kong journal of paediatrics,1013-9923,1013-9923,NA,0,0,1,0,Pediatrics,NA,NA,MEDCOM LTD,NA +hong kong law journal,0378-0600,NA,NA,0,1,0,0,NA,Law,NA,SWEET MAXWELL LTD,NA +hong kong medical journal,1024-2708,1024-2708,HongKongMedJ,0,0,1,1,"Medicine, General & Internal",NA,NA,HONG KONG ACAD MEDICINE PRESS,NA +horizons,0360-9669,2050-8557,HorizonsJournal,1,0,0,1,NA,NA,Religion,CAMBRIDGE UNIV PRESS,2012-01-06 +hormone and metabolic research,0018-5043,1439-4286,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,GEORG THIEME VERLAG KG,NA +hormone research in paediatrics,1663-2818,1663-2826,NA,0,0,1,0,Endocrinology & Metabolism | Pediatrics,NA,NA,KARGER,NA +hormones-international journal of endocrinology and metabolism,1109-3099,2520-8721,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER INT PUBL AG,NA +hormones and behavior,0018-506X,1095-6867,NA,0,0,1,0,Behavioral Sciences | Endocrinology & Metabolism,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +horticultura brasileira,0102-0536,1806-9991,NA,0,0,1,0,Horticulture,NA,NA,ASSOC BRASILEIRA HORTICULTURA,NA +horticulturae,2311-7524,2311-7524,NA,0,0,1,0,Horticulture,NA,NA,MDPI,NA +horticultural plant journal,2095-9885,2468-0141,NA,0,0,1,0,Plant Sciences | Horticulture,NA,NA,ELSEVIER,NA +horticultural science,0862-867X,1805-9333,NA,0,0,1,0,Horticulture,NA,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +horticultural science & technology,1226-8763,2465-8588,NA,0,0,1,0,Horticulture,NA,NA,KOREAN SOC HORTICULTURAL SCIENCE,NA +horticulture environment and biotechnology,2211-3452,2211-3460,NA,0,0,1,0,Horticulture,NA,NA,KOREAN SOC HORTICULTURAL SCIENCE,NA +horticulture journal,2189-0102,2189-0110,NA,0,0,1,0,Horticulture,NA,NA,JAPAN SOC HORTICULTURAL SCI,NA +horticulture research,2662-6810,2052-7276,Hortres,0,0,1,1,Plant Sciences | Genetics & Heredity | Horticulture,NA,NA,"NANJING AGRICULTURAL UNIV",2014-11-06 +hortscience,0018-5345,2327-9834,NA,0,0,1,0,Horticulture,NA,NA,AMER SOC HORTICULTURAL SCIENCE,NA +horttechnology,1063-0198,1943-7714,NA,0,0,1,0,Horticulture,NA,NA,AMER SOC HORTICULTURAL SCIENCE,NA +houille blanche-revue internationale de l eau,0018-6368,1958-5551,NA,0,0,1,0,Water Resources,NA,NA,TAYLOR & FRANCIS LTD,NA +housing policy debate,1051-1482,2152-050X,HousPolDebate,0,1,0,1,NA,Development Studies | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-04-23 +housing studies,0267-3037,1466-1810,HousingJournal,0,1,0,1,NA,Environmental Studies | Regional & Urban Planning | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-12-07 +housing theory & society,1403-6096,1651-2278,NA,0,1,0,0,NA,Environmental Studies | Regional & Urban Planning | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +houston journal of mathematics,0362-1588,NA,NA,0,0,1,0,Mathematics,NA,NA,UNIV HOUSTON,NA +hpb,1365-182X,1477-2574,hpbjournal,0,0,1,1,Gastroenterology & Hepatology | Surgery,NA,NA,ELSEVIER SCI LTD,2019-03-21 +hrvatski filmski ljetopis,1330-7665,NA,NA,1,0,0,0,NA,NA,"Film, Radio, Television",CROATIAN FILM CLUBS ASSOC,NA +hss journal,1556-3316,1556-3324,NA,0,0,1,0,Surgery | Orthopedics,NA,NA,SAGE PUBLICATIONS INC,NA +hts teologiese studies-theological studies,0259-9422,2072-8050,NA,1,0,0,0,NA,NA,Religion,AOSIS,NA +hudebni veda,0018-7003,NA,NA,1,0,0,0,NA,NA,Music,CZECH ACAD SCIENCES PRESS,NA +hudson review,0018-702X,2325-5935,TheHudsonReview,1,0,0,1,NA,NA,Literary Reviews,HUDSON REVIEW INC,2011-09-08 +human-centric computing and information sciences,2192-1962,2192-1962,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,KOREA INFORMATION PROCESSING SOC,NA +human-computer interaction,0737-0024,1532-7051,hcinteraction,0,0,1,1,"Computer Science, Cybernetics | Computer Science, Theory & Methods",NA,NA,TAYLOR & FRANCIS INC,2015-05-19 +human-wildlife interactions,1934-4392,1936-8046,HWI_Journal,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,JACK H BERRYMAN INST,2020-05-20 +human & experimental toxicology,0960-3271,1477-0903,NA,0,0,1,0,Toxicology,NA,NA,SAGE PUBLICATIONS LTD,NA +human and ecological risk assessment,1080-7039,1549-7860,NA,0,0,1,0,Environmental Sciences,NA,NA,TAYLOR & FRANCIS INC,NA +human biology,0018-7143,1534-6617,HumanBioJournal,0,1,1,1,Biology | Genetics & Heredity,Anthropology,NA,WAYNE STATE UNIV PRESS,2014-08-29 +human biology,0018-7143,1534-6617,HumanBioJournal,0,1,1,1,Biology | Genetics & Heredity,Anthropology,NA,WAYNE STATE UNIV PRESS,2014-08-29 +human brain mapping,1065-9471,1097-0193,NA,0,0,1,0,"Neurosciences | Neuroimaging | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,NA +human cell,0914-7470,1749-0774,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGER JAPAN KK,NA +human communication research,0360-3989,1468-2958,hcr_journal,0,1,0,1,NA,Communication,NA,OXFORD UNIV PRESS INC,2021-08-15 +human development,0018-716X,1423-0054,NA,0,1,0,0,NA,"Psychology, Development",NA,KARGER,NA +human dimensions of wildlife,1087-1209,1533-158X,NA,0,0,1,0,Biodiversity Conservation | Environmental Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +human ecology,0300-7839,1572-9915,NA,0,1,0,0,NA,Anthropology | Environmental Studies | Sociology,NA,SPRINGER/PLENUM PUBLISHERS,NA +human ecology review,1074-4827,2204-0919,NA,0,1,0,0,NA,Environmental Studies | Sociology,NA,ANU PRESS,NA +human factors,0018-7208,1547-8181,HFES_HFJournal,0,1,1,1,"Behavioral Sciences | Engineering, Industrial | Psychology","Ergonomics | Psychology, Applied",NA,SAGE PUBLICATIONS INC,2022-02-28 +human factors,0018-7208,1547-8181,HFES_HFJournal,0,1,1,1,"Behavioral Sciences | Engineering, Industrial | Psychology","Ergonomics | Psychology, Applied",NA,SAGE PUBLICATIONS INC,2022-02-28 +human factors and ergonomics in manufacturing & service industries,1090-8471,1520-6564,NA,0,1,1,0,"Engineering, Manufacturing",Ergonomics,NA,WILEY,NA +human factors and ergonomics in manufacturing & service industries,1090-8471,1520-6564,NA,0,1,1,0,"Engineering, Manufacturing",Ergonomics,NA,WILEY,NA +human fertility,1464-7273,1742-8149,NA,0,0,1,0,Obstetrics & Gynecology | Reproductive Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +human gene therapy,1043-0342,1557-7422,HGTJournal,0,0,1,1,"Biotechnology & Applied Microbiology | Genetics & Heredity | Medicine, Research & Experimental",NA,NA,"MARY ANN LIEBERT, INC",2016-02-29 +human genetics,0340-6717,1432-1203,NA,0,0,1,0,Genetics & Heredity,NA,NA,SPRINGER,NA +human genomics,1473-9542,1479-7364,HumanGenomics,0,0,1,1,Genetics & Heredity,NA,NA,BMC,2018-01-01 +human heredity,0001-5652,1423-0062,NA,0,0,1,0,Genetics & Heredity,NA,NA,KARGER,NA +human immunology,0198-8859,1879-1166,NA,0,0,1,0,Immunology,NA,NA,ELSEVIER SCIENCE INC,NA +human molecular genetics,0964-6906,1460-2083,hmg_journal,0,0,1,1,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,OXFORD UNIV PRESS,2019-01-24 +human movement science,0167-9457,1872-7646,NA,0,1,1,0,Neurosciences | Psychology | Sport Sciences,"Psychology, Experimental",NA,ELSEVIER,NA +human movement science,0167-9457,1872-7646,NA,0,1,1,0,Neurosciences | Psychology | Sport Sciences,"Psychology, Experimental",NA,ELSEVIER,NA +human mutation,1059-7794,1098-1004,NA,0,0,1,0,Genetics & Heredity,NA,NA,WILEY,NA +human nature-an interdisciplinary biosocial perspective,1045-6767,1936-4776,NA,0,1,0,0,NA,"Anthropology | Social Sciences, Biomedical",NA,SPRINGER,NA +human organization,0018-7259,1938-3525,NA,0,1,0,0,NA,"Anthropology | Social Sciences, Interdisciplinary",NA,SOC APPLIED ANTHROPOLOGY,NA +human pathology,0046-8177,1532-8392,Human_Pathology,0,0,1,1,Pathology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2017-02-12 +human performance,0895-9285,1532-7043,NA,0,1,0,0,NA,"Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +human psychopharmacology-clinical and experimental,0885-6222,1099-1077,NA,0,0,1,0,Clinical Neurology | Pharmacology & Pharmacy | Psychiatry | Psychology,NA,NA,WILEY,NA +human relations,0018-7267,1741-282X,NA,0,1,0,0,NA,"Management | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,NA +human reproduction,0268-1161,1460-2350,NA,0,0,1,0,Obstetrics & Gynecology | Reproductive Biology,NA,NA,OXFORD UNIV PRESS,NA +human reproduction open,2399-3529,2399-3529,NA,0,0,1,0,Obstetrics & Gynecology | Reproductive Biology,NA,NA,OXFORD UNIV PRESS,NA +human reproduction update,1355-4786,1460-2369,NA,0,0,1,0,Obstetrics & Gynecology | Reproductive Biology,NA,NA,OXFORD UNIV PRESS,NA +human resource development quarterly,1044-8004,1532-1096,NA,0,1,0,0,NA,"Industrial Relations & Labor | Psychology, Applied | Management",NA,"WILEY PERIODICALS, INC",NA +human resource development review,1534-4843,1552-6712,NA,0,1,0,0,NA,Management,NA,SAGE PUBLICATIONS INC,NA +human resource management,0090-4848,1099-050X,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,"WILEY PERIODICALS, INC",NA +human resource management journal,0954-5395,1748-8583,HRMJournal,0,1,0,1,NA,Industrial Relations & Labor | Management,NA,WILEY,2019-01-22 +human resource management review,1053-4822,1873-7889,NA,0,1,0,0,NA,Management,NA,ELSEVIER,NA +human resources for health,1478-4491,1478-4491,HRH_Journal,0,1,0,1,NA,Health Policy & Services | Industrial Relations & Labor,NA,BMC,2010-06-11 +human rights law review,1461-7781,1744-1021,NA,0,1,0,0,NA,International Relations | Law,NA,OXFORD UNIV PRESS,NA +human rights quarterly,0275-0392,1085-794X,NA,0,1,0,0,NA,Political Science | Social Issues,NA,JOHNS HOPKINS UNIV PRESS,NA +human service organizations management leadership & governance,2330-3131,2330-314X,NA,0,1,0,0,NA,Public Administration | Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +human studies,0163-8548,1572-851X,NA,0,1,0,0,NA,Ethics | Sociology,NA,SPRINGER,NA +human vaccines & immunotherapeutics,2164-5515,2164-554X,NA,0,0,1,0,Biotechnology & Applied Microbiology | Immunology,NA,NA,TAYLOR & FRANCIS INC,NA +humanities & social sciences communications,NA,2662-9992,HSScomms,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",SPRINGERNATURE,2014-02-19 +hume studies,0319-7336,1947-9921,NA,1,0,0,0,NA,NA,Philosophy,HUME SOCIETY,NA +humor-international journal of humor research,0933-1719,1613-3722,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Language & Linguistics,DE GRUYTER MOUTON,NA +humor-international journal of humor research,0933-1719,1613-3722,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Language & Linguistics,DE GRUYTER MOUTON,NA +huntington library quarterly,0018-7895,1544-399X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV PENNSYLVANIA PRESS,NA +husserl studies,0167-9848,1572-8501,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +hydrobiologia,0018-8158,1573-5117,HYDR_Springer,0,0,1,1,Marine & Freshwater Biology,NA,NA,SPRINGER,2017-06-12 +hydrogeology journal,1431-2174,1435-0157,HydrogeologyJ,0,0,1,1,"Geosciences, Multidisciplinary | Water Resources",NA,NA,SPRINGER,2012-05-21 +hydrological processes,0885-6087,1099-1085,HydroProcesses,0,0,1,1,Water Resources,NA,NA,WILEY,2019-04-01 +hydrological sciences journal-journal des sciences hydrologiques,0262-6667,2150-3435,NA,0,0,1,0,Water Resources,NA,NA,TAYLOR & FRANCIS LTD,NA +hydrologie und wasserbewirtschaftung,1439-1783,NA,NA,0,0,1,0,Water Resources,NA,NA,BUNDESANSTALT GEWASSERKUNDE-BFG,NA +hydrology and earth system sciences,1027-5606,1607-7938,EGU_HESS,0,0,1,1,"Geosciences, Multidisciplinary | Water Resources",NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-01-21 +hydrology research,1998-9563,2224-7955,NA,0,0,1,0,Water Resources,NA,NA,IWA PUBLISHING,NA +hydrometallurgy,0304-386X,1879-1158,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,ELSEVIER,NA +hyle,1433-5158,1617-4240,NA,1,1,1,0,"History & Philosophy Of Science | Chemistry, Multidisciplinary",History & Philosophy Of Science,History & Philosophy Of Science,HYLE PUBL,NA +hyle,1433-5158,1617-4240,NA,1,1,1,0,"History & Philosophy Of Science | Chemistry, Multidisciplinary",History & Philosophy Of Science,History & Philosophy Of Science,HYLE PUBL,NA +hyle,1433-5158,1617-4240,NA,1,1,1,0,"History & Philosophy Of Science | Chemistry, Multidisciplinary",History & Philosophy Of Science,History & Philosophy Of Science,HYLE PUBL,NA +hypatia-a journal of feminist philosophy,0887-5367,1527-2001,HypatiaJournal,1,1,0,1,NA,Women'S Studies,Philosophy,CAMBRIDGE UNIV PRESS,2017-09-23 +hypatia-a journal of feminist philosophy,0887-5367,1527-2001,HypatiaJournal,1,1,0,1,NA,Women'S Studies,Philosophy,CAMBRIDGE UNIV PRESS,2017-09-23 +hypertension,0194-911X,1524-4563,HyperAHA,0,0,1,1,Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2012-01-20 +hypertension in pregnancy,1064-1955,1525-6065,NA,0,0,1,0,Obstetrics & Gynecology | Physiology | Peripheral Vascular Diseases,NA,NA,TAYLOR & FRANCIS INC,NA +hypertension research,0916-9636,1348-4214,Hypertens_Res,0,0,1,1,Peripheral Vascular Diseases,NA,NA,SPRINGERNATURE,2021-12-24 +hystrix-italian journal of mammalogy,0394-1914,1825-5272,NA,0,0,1,0,Zoology,NA,NA,ASSOC TERIOLOGICA ITALIANA,NA +i-perception,2041-6695,2041-6695,NA,0,1,0,0,NA,"Psychology, Experimental",NA,SAGE PUBLICATIONS LTD,NA +iawa journal,0928-1541,2294-1932,NA,0,0,1,0,Forestry,NA,NA,BRILL,NA +iberica,1139-7241,2340-2784,IbericaJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,AELFE,2020-02-04 +iberica,1139-7241,2340-2784,IbericaJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,AELFE,2020-02-04 +iberoromania,0019-0993,1865-9039,NA,1,0,0,0,NA,NA,"Language & Linguistics | Literature, Romance",WALTER DE GRUYTER GMBH,NA +ibis,0019-1019,1474-919X,IBIS_journal,0,0,1,1,Ornithology,NA,NA,WILEY,2011-06-02 +ibm journal of research and development,0018-8646,2151-8556,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,IBM CORP,NA +icarus,0019-1035,1090-2643,IcarusJournal,0,0,1,1,Astronomy & Astrophysics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2019-04-26 +icelandic agricultural sciences,1670-567X,2298-786X,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,RANNSOKNASTOFNUN LANDBUNADARINS,NA +ices journal of marine science,1054-3139,1095-9289,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology | Oceanography,NA,NA,OXFORD UNIV PRESS,NA +icga journal,1389-6911,2468-2438,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,IOS PRESS,NA +ichnos-an international journal for plant and animal traces,1042-0940,1563-5236,NA,0,0,1,0,Paleontology,NA,NA,TAYLOR & FRANCIS INC,NA +ichthyological exploration of freshwaters,0936-9902,NA,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,VERLAG DR FRIEDRICH PFEIL,NA +ichthyological research,1341-8998,1616-3915,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology | Zoology,NA,NA,SPRINGER JAPAN KK,NA +ichthyology and herpetology,2766-1512,2766-1520,NA,0,0,1,0,Zoology,NA,NA,AMER SOC ICHTHYOLOGISTS & HERPETOLOGISTS,NA +icon-international journal of constitutional law,1474-2640,1474-2659,ICONnect_blog,0,1,0,1,NA,Law,NA,OXFORD UNIV PRESS,2012-11-06 +icsid review-foreign investment law journal,0258-3690,2049-1999,NA,0,1,0,0,NA,Law,NA,OXFORD UNIV PRESS,NA +ict express,2405-9595,2405-9595,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,ELSEVIER,NA +idealistic studies,0046-8541,2153-8239,NA,1,0,0,0,NA,NA,Philosophy,PHILOSOPHY DOCUMENTATION CENTER,NA +ideas y valores,0120-0062,2011-3668,ideasyvalores_,1,0,0,1,NA,NA,Philosophy,"UNIV NAC COLOMBIA, FAC CIENCIAS HUMANAS",2013-09-06 +ideggyogyaszati szemle-clinical neuroscience,0019-1442,2498-6208,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,LITERATURA MEDICA,NA +identities-global studies in culture and power,1070-289X,1547-3384,IDjnl,1,1,0,1,NA,Cultural Studies | Ethnic Studies,Cultural Studies,TAYLOR & FRANCIS INC,2016-12-07 +identities-global studies in culture and power,1070-289X,1547-3384,IDjnl,1,1,0,1,NA,Cultural Studies | Ethnic Studies,Cultural Studies,TAYLOR & FRANCIS INC,2016-12-07 +idojaras,0324-6329,0324-6329,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,HUNGARIAN METEOROLOGICAL SERVICE,NA +ids bulletin-institute of development studies,0265-5012,1759-5436,NA,0,1,0,0,NA,Area Studies | Development Studies,NA,INST DEVELOPMENT STUDIES,NA +ieee-acm transactions on audio speech and language processing,2329-9290,2329-9304,NA,0,0,1,0,"Acoustics | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee-acm transactions on computational biology and bioinformatics,1545-5963,1557-9964,NA,0,0,1,0,"Biochemical Research Methods | Computer Science, Interdisciplinary Applications | Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,IEEE COMPUTER SOC,NA +ieee-acm transactions on networking,1063-6692,1558-2566,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee-asme transactions on mechatronics,1083-4435,1941-014X,NA,0,0,1,0,"Automation & Control Systems | Engineering, Manufacturing | Engineering, Electrical & Electronic | Engineering, Mechanical",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee-caa journal of automatica sinica,2329-9266,2329-9274,NA,0,0,1,0,Automation & Control Systems,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee access,2169-3536,2169-3536,IEEEAccess,0,0,1,1,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2014-07-24 +ieee aerospace and electronic systems magazine,0885-8985,1557-959X,NA,0,0,1,0,"Engineering, Aerospace | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee annals of the history of computing,1058-6180,1934-1547,NA,1,0,1,0,"History & Philosophy Of Science | Computer Science, Theory & Methods",NA,History & Philosophy Of Science,IEEE COMPUTER SOC,NA +ieee annals of the history of computing,1058-6180,1934-1547,NA,1,0,1,0,"History & Philosophy Of Science | Computer Science, Theory & Methods",NA,History & Philosophy Of Science,IEEE COMPUTER SOC,NA +ieee antennas and propagation magazine,1045-9243,1558-4143,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee antennas and wireless propagation letters,1536-1225,1548-5757,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee circuits and systems magazine,1531-636X,1558-0830,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee communications letters,1089-7798,1558-2558,NA,0,0,1,0,Telecommunications,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee communications magazine,0163-6804,1558-1896,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee communications surveys and tutorials,1553-877X,1553-877X,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee computational intelligence magazine,1556-603X,1556-6048,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee computer architecture letters,1556-6056,1556-6064,IEEECAL,0,0,1,1,"Computer Science, Hardware & Architecture",NA,NA,IEEE COMPUTER SOC,2019-07-16 +ieee computer graphics and applications,0272-1716,1558-1756,ieeecga,0,0,1,1,"Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,2009-07-31 +ieee consumer electronics magazine,2162-2248,2162-2256,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee control systems magazine,1066-033X,1941-000X,NA,0,0,1,0,Automation & Control Systems,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee design & test,2168-2356,2168-2364,IEEEDT,0,0,1,1,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2016-01-14 +ieee electrical insulation magazine,0883-7554,1558-4402,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee electron device letters,0741-3106,1558-0563,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee embedded systems letters,1943-0663,1943-0671,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee geoscience and remote sensing letters,1545-598X,1558-0571,NA,0,0,1,0,"Geochemistry & Geophysics | Engineering, Electrical & Electronic | Remote Sensing | Imaging Science & Photographic Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee geoscience and remote sensing magazine,2473-2397,2168-6831,NA,0,0,1,0,Geochemistry & Geophysics | Remote Sensing | Imaging Science & Photographic Technology,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee industrial electronics magazine,1932-4529,1941-0115,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee industry applications magazine,1077-2618,1558-0598,NA,0,0,1,0,"Engineering, Industrial | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee instrumentation & measurement magazine,1094-6969,1941-0123,NA,0,0,1,0,"Engineering, Electrical & Electronic | Instruments & Instrumentation",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee intelligent systems,1541-1672,1941-1294,ieeeintelligent,0,0,1,1,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,IEEE COMPUTER SOC,2009-07-31 +ieee intelligent transportation systems magazine,1939-1390,1941-1197,NA,0,0,1,0,"Engineering, Electrical & Electronic | Transportation Science & Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee internet computing,1089-7801,1941-0131,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,NA +ieee internet of things journal,2327-4662,2327-4662,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of biomedical and health informatics,2168-2194,2168-2208,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Interdisciplinary Applications | Mathematical & Computational Biology | Medical Informatics",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of emerging and selected topics in power electronics,2168-6777,2168-6785,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of oceanic engineering,0364-9059,1558-1691,NA,0,0,1,0,"Engineering, Civil | Engineering, Ocean | Engineering, Electrical & Electronic | Oceanography",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of photovoltaics,2156-3381,2156-3403,NA,0,0,1,0,"Energy & Fuels | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of quantum electronics,0018-9197,1558-1713,NA,0,0,1,0,"Engineering, Electrical & Electronic | Quantum Science & Technology | Optics | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of selected topics in applied earth observations and remote sensing,1939-1404,2151-1535,NA,0,0,1,0,"Engineering, Electrical & Electronic | Geography, Physical | Remote Sensing | Imaging Science & Photographic Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of selected topics in quantum electronics,1077-260X,1558-4542,NA,0,0,1,0,"Engineering, Electrical & Electronic | Quantum Science & Technology | Optics | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of selected topics in signal processing,1932-4553,1941-0484,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of solid-state circuits,0018-9200,1558-173X,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of the electron devices society,2168-6734,2168-6734,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal of translational engineering in health and medicine,2168-2372,2168-2372,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal on emerging and selected topics in circuits and systems,2156-3357,2156-3365,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee journal on selected areas in communications,0733-8716,1558-0008,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee latin america transactions,1548-0992,1548-0992,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee magnetics letters,1949-307X,1949-3088,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee micro,0272-1732,1937-4143,ieeemicro,0,0,1,1,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,2009-07-31 +ieee microwave and wireless components letters,1531-1309,1558-1764,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee microwave magazine,1527-3342,1557-9581,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee multimedia,1070-986X,1941-0166,ieeemultimedia,0,0,1,1,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,IEEE COMPUTER SOC,2009-07-31 +ieee network,0890-8044,1558-156X,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee pervasive computing,1536-1268,1558-2590,ieeepervasive,0,0,1,1,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE COMPUTER SOC,2009-07-31 +ieee photonics journal,1943-0655,1943-0647,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee photonics technology letters,1041-1135,1941-0174,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee power & energy magazine,1540-7977,1558-4216,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee pulse,2154-2287,2154-2317,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee reviews in biomedical engineering,1937-3333,1941-1189,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee robotics & automation magazine,1070-9932,1558-223X,NA,0,0,1,0,Automation & Control Systems | Robotics,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee robotics and automation letters,2377-3766,2377-3766,NA,0,0,1,0,Robotics,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee security & privacy,1540-7993,1558-4046,securityprivacy,0,0,1,1,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,2009-04-03 +ieee sensors journal,1530-437X,1558-1748,NA,0,0,1,0,"Engineering, Electrical & Electronic | Instruments & Instrumentation | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee signal processing letters,1070-9908,1558-2361,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee signal processing magazine,1053-5888,1558-0792,IEEEspm,0,0,1,1,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2015-03-16 +ieee software,0740-7459,1937-4194,ieeesoftware,0,0,1,1,"Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,2009-05-20 +ieee spectrum,0018-9235,1939-9340,IEEESpectrum,0,0,1,1,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2008-08-12 +ieee systems journal,1932-8184,1937-9234,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Operations Research & Management Science | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee technology and society magazine,0278-0097,1937-416X,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on aerospace and electronic systems,0018-9251,1557-9603,NA,0,0,1,0,"Engineering, Aerospace | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on affective computing,1949-3045,1949-3045,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Cybernetics",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on antennas and propagation,0018-926X,1558-2221,ieeetap,0,0,1,1,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2021-03-08 +ieee transactions on applied superconductivity,1051-8223,1558-2515,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on automatic control,0018-9286,1558-2523,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on automation science and engineering,1545-5955,1558-3783,NA,0,0,1,0,Automation & Control Systems,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on big data,2332-7790,2332-7790,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on biomedical circuits and systems,1932-4545,1940-9990,IEEETBioCAS,0,0,1,1,"Engineering, Biomedical | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2019-09-29 +ieee transactions on biomedical engineering,0018-9294,1558-2531,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on broadcasting,0018-9316,1557-9611,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on circuits and systems for video technology,1051-8215,1558-2205,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on circuits and systems i-regular papers,1549-8328,1558-0806,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on circuits and systems ii-express briefs,1549-7747,1558-3791,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on cloud computing,2168-7161,2168-7161,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on cognitive and developmental systems,2379-8920,2379-8939,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Robotics | Neurosciences",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on cognitive communications and networking,2332-7731,2332-7731,NA,0,0,1,0,Telecommunications,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on communications,0090-6778,1558-0857,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on components packaging and manufacturing technology,2156-3950,2156-3985,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Electrical & Electronic | Materials Science, Multidisciplinary",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on computational imaging,2573-0436,2333-9403,NA,0,0,1,0,"Engineering, Electrical & Electronic | Imaging Science & Photographic Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on computational social systems,2329-924X,2329-924X,NA,0,0,1,0,"Computer Science, Cybernetics | Computer Science, Information Systems",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on computer-aided design of integrated circuits and systems,0278-0070,1937-4151,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Interdisciplinary Applications | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on computers,0018-9340,1557-9956,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on consumer electronics,0098-3063,1558-4127,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on control of network systems,2325-5870,2372-2533,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Information Systems",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on control systems technology,1063-6536,1558-0865,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on cybernetics,2168-2267,2168-2275,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Artificial Intelligence | Computer Science, Cybernetics",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on dependable and secure computing,1545-5971,1941-0018,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on device and materials reliability,1530-4388,1558-2574,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on dielectrics and electrical insulation,1070-9878,1558-4135,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on education,0018-9359,1557-9638,NA,0,0,1,0,"Education, Scientific Disciplines | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on electromagnetic compatibility,0018-9375,1558-187X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on electron devices,0018-9383,1557-9646,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on emerging topics in computational intelligence,2471-285X,2471-285X,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on emerging topics in computing,2168-6750,2168-6750,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on energy conversion,0885-8969,1558-0059,NA,0,0,1,0,"Energy & Fuels | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on engineering management,0018-9391,1558-0040,NA,0,1,1,0,"Engineering, Industrial",Business | Management,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on engineering management,0018-9391,1558-0040,NA,0,1,1,0,"Engineering, Industrial",Business | Management,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on evolutionary computation,1089-778X,1941-0026,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on fuzzy systems,1063-6706,1941-0034,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on games,2475-1502,2475-1510,IEEETxnOnGames,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Software Engineering",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2015-02-12 +ieee transactions on geoscience and remote sensing,0196-2892,1558-0644,NA,0,0,1,0,"Geochemistry & Geophysics | Engineering, Electrical & Electronic | Remote Sensing | Imaging Science & Photographic Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on green communications and networking,2473-2400,2473-2400,NA,0,0,1,0,Telecommunications,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on haptics,1939-1412,2329-4051,NA,0,0,1,0,"Computer Science, Cybernetics",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on human-machine systems,2168-2291,2168-2305,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Cybernetics",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on image processing,1057-7149,1941-0042,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on industrial electronics,0278-0046,1557-9948,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic | Instruments & Instrumentation",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on industrial informatics,1551-3203,1941-0050,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Interdisciplinary Applications | Engineering, Industrial",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on industry applications,0093-9994,1939-9367,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on information forensics and security,1556-6013,1556-6021,NA,0,0,1,0,"Computer Science, Theory & Methods | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on information theory,0018-9448,1557-9654,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on instrumentation and measurement,0018-9456,1557-9662,NA,0,0,1,0,"Engineering, Electrical & Electronic | Instruments & Instrumentation",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on intelligent transportation systems,1524-9050,1558-0016,NA,0,0,1,0,"Engineering, Civil | Engineering, Electrical & Electronic | Transportation Science & Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on intelligent vehicles,2379-8858,2379-8904,NA,0,0,1,0,"Engineering, Electrical & Electronic | Transportation Science & Technology | Computer Science, Artificial Intelligence",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on knowledge and data engineering,1041-4347,1558-2191,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Engineering, Electrical & Electronic",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on learning technologies,1939-1382,1939-1382,IEEE_TLT,0,1,1,1,"Computer Science, Interdisciplinary Applications",Education & Educational Research,NA,IEEE COMPUTER SOC,2018-01-17 +ieee transactions on learning technologies,1939-1382,1939-1382,IEEE_TLT,0,1,1,1,"Computer Science, Interdisciplinary Applications",Education & Educational Research,NA,IEEE COMPUTER SOC,2018-01-17 +ieee transactions on magnetics,0018-9464,1941-0069,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on medical imaging,0278-0062,1558-254X,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Biomedical | Engineering, Electrical & Electronic | Imaging Science & Photographic Technology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on microwave theory and techniques,0018-9480,1557-9670,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on mobile computing,1536-1233,1558-0660,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on multimedia,1520-9210,1941-0077,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on nanobioscience,1536-1241,1558-2639,NA,0,0,1,0,Biochemical Research Methods | Nanoscience & Nanotechnology,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on nanotechnology,1536-125X,1941-0085,ieeetnano,0,0,1,1,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on network and service management,1932-4537,1932-4537,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on network science and engineering,2327-4697,2327-4697,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on neural networks and learning systems,2162-237X,2162-2388,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Hardware & Architecture | Computer Science, Theory & Methods | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on neural systems and rehabilitation engineering,1534-4320,1558-0210,TNSRE1,0,0,1,1,"Engineering, Biomedical | Rehabilitation",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2019-04-23 +ieee transactions on nuclear science,0018-9499,1558-1578,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nuclear Science & Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on parallel and distributed systems,1045-9219,1558-2183,NA,0,0,1,0,"Computer Science, Theory & Methods | Engineering, Electrical & Electronic",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on pattern analysis and machine intelligence,0162-8828,1939-3539,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on plasma science,0093-3813,1939-9375,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on power delivery,0885-8977,1937-4208,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on power electronics,0885-8993,1941-0107,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on power systems,0885-8950,1558-0679,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on professional communication,0361-1434,1558-1500,ieeeprocomm,0,1,0,1,NA,Communication,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2014-07-08 +ieee transactions on reliability,0018-9529,1558-1721,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on robotics,1552-3098,1941-0468,NA,0,0,1,0,Robotics,NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on semiconductor manufacturing,0894-6507,1558-2345,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Electrical & Electronic | Physics, Applied | Physics, Condensed Matter",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on services computing,1939-1374,1939-1374,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on signal and information processing over networks,2373-776X,2373-776X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on signal processing,1053-587X,1941-0476,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on smart grid,1949-3053,1949-3061,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on software engineering,0098-5589,1939-3520,NA,0,0,1,0,"Computer Science, Software Engineering | Engineering, Electrical & Electronic",NA,NA,IEEE COMPUTER SOC,NA +ieee transactions on sustainable computing,2377-3782,2377-3782,NA,0,0,1,0,"Telecommunications | Computer Science, Hardware & Architecture | Computer Science, Information Systems",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on sustainable energy,1949-3029,1949-3037,NA,0,0,1,0,"Green & Sustainable Science & Technology | Energy & Fuels | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on systems man cybernetics-systems,2168-2216,2168-2232,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Cybernetics",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on terahertz science and technology,2156-342X,2156-3446,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on transportation electrification,2332-7782,2332-7782,NA,0,0,1,0,"Engineering, Electrical & Electronic | Transportation Science & Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on ultrasonics ferroelectrics and frequency control,0885-3010,1525-8955,NA,0,0,1,0,"Acoustics | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on vehicular technology,0018-9545,1939-9359,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications | Transportation Science & Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on very large scale integration (vlsi) systems,1063-8210,1557-9999,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee transactions on visualization and computer graphics,1077-2626,1941-0506,ieee_tvcg,0,0,1,1,"Computer Science, Software Engineering",NA,NA,IEEE COMPUTER SOC,2018-04-05 +ieee transactions on wireless communications,1536-1276,1558-2248,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee vehicular technology magazine,1556-6072,1556-6080,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications | Transportation Science & Technology",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee wireless communications,1536-1284,1558-0687,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieee wireless communications letters,2162-2337,2162-2345,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +ieej transactions on electrical and electronic engineering,1931-4973,1931-4981,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +ieice electronics express,1349-2543,1349-2543,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEICE-INST ELECTRONICS INFORMATION COMMUNICATION ENGINEERS,NA +ieice transactions on communications,0916-8516,1745-1345,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,IEICE-INST ELECTRONICS INFORMATION COMMUNICATION ENGINEERS,NA +ieice transactions on electronics,1745-1353,1745-1353,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEICE-INST ELECTRONICS INFORMATION COMMUNICATION ENGINEERS,NA +ieice transactions on fundamentals of electronics communications and computer sciences,0916-8508,1745-1337,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Engineering, Electrical & Electronic",NA,NA,IEICE-INST ELECTRONICS INFORMATION COMMUNICATION ENGINEERS,NA +ieice transactions on information and systems,1745-1361,1745-1361,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,IEICE-INST ELECTRONICS INFORMATION COMMUNICATION ENGINEERS,NA +iet biometrics,2047-4938,2047-4946,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,WILEY,NA +iet circuits devices & systems,1751-858X,1751-8598,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +iet communications,1751-8628,1751-8636,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,INST ENGINEERING TECHNOLOGY-IET,NA +iet computer vision,1751-9632,1751-9640,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,WILEY,NA +iet computers and digital techniques,1751-8601,1751-861X,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods",NA,NA,WILEY,NA +iet control theory and applications,1751-8644,1751-8652,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic | Instruments & Instrumentation",NA,NA,WILEY,NA +iet electric power applications,1751-8660,1751-8679,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +iet electrical systems in transportation,2042-9738,2042-9746,NA,0,0,1,0,"Engineering, Electrical & Electronic | Transportation Science & Technology",NA,NA,INST ENGINEERING TECHNOLOGY-IET,NA +iet generation transmission & distribution,1751-8687,1751-8695,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,INST ENGINEERING TECHNOLOGY-IET,NA +iet image processing,1751-9659,1751-9667,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic | Imaging Science & Photographic Technology",NA,NA,WILEY,NA +iet information security,1751-8709,1751-8717,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,WILEY,NA +iet intelligent transport systems,1751-956X,1751-9578,NA,0,0,1,0,"Engineering, Electrical & Electronic | Transportation Science & Technology",NA,NA,WILEY,NA +iet microwaves antennas & propagation,1751-8725,1751-8733,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,WILEY,NA +iet nanobiotechnology,1751-8741,1751-875X,NA,0,0,1,0,Biochemical Research Methods | Nanoscience & Nanotechnology,NA,NA,WILEY,NA +iet optoelectronics,1751-8768,1751-8776,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Telecommunications",NA,NA,WILEY,NA +iet power electronics,1755-4535,1755-4543,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +iet radar sonar and navigation,1751-8784,1751-8792,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,WILEY,NA +iet renewable power generation,1752-1416,1752-1424,NA,0,0,1,0,"Green & Sustainable Science & Technology | Energy & Fuels | Engineering, Electrical & Electronic",NA,NA,INST ENGINEERING TECHNOLOGY-IET,NA +iet science measurement & technology,1751-8822,1751-8830,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +iet signal processing,1751-9675,1751-9683,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +iet software,1751-8806,1751-8814,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,WILEY,NA +iet systems biology,1751-8849,1751-8857,NA,0,0,1,0,Cell Biology | Mathematical & Computational Biology,NA,NA,INST ENGINEERING TECHNOLOGY-IET,NA +iete journal of research,0377-2063,0974-780X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,TAYLOR & FRANCIS LTD,NA +iete technical review,0256-4602,0974-5971,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,TAYLOR & FRANCIS LTD,NA +iforest-biogeosciences and forestry,1971-7458,1971-7458,NA,0,0,1,0,Forestry,NA,NA,SISEF-SOC ITALIANA SELVICOLTURA ECOL FORESTALE,NA +iheringia serie botanica,0073-4705,2446-8231,NA,0,0,1,0,Plant Sciences,NA,NA,"FUNDACAO ZOOBOTANICA RIO GRANDE SUL, MUSEU CIENCIAS NATURAIS",NA +iheringia serie zoologia,0073-4721,1678-4766,NA,0,0,1,0,Zoology,NA,NA,"FUNDACAO ZOOBOTANICA RIO GRANDE SUL, MUSEU CIENCIAS NATURAIS",NA +iise transactions,2472-5854,2472-5862,IISE_TXN,0,0,1,1,"Engineering, Industrial | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS INC,2021-03-30 +ilar journal,1084-2020,1930-6180,NA,0,0,1,0,Veterinary Sciences,NA,NA,OXFORD UNIV PRESS,NA +ilr review,0019-7939,2162-271X,ILRReview,0,1,0,1,NA,Industrial Relations & Labor,NA,SAGE PUBLICATIONS INC,2018-12-03 +ima fungus,2210-6340,2210-6359,NA,0,0,1,0,Mycology,NA,NA,BMC,NA +ima journal of applied mathematics,0272-4960,1464-3634,ImaApplied,0,0,1,1,"Mathematics, Applied",NA,NA,OXFORD UNIV PRESS,2020-09-29 +ima journal of management mathematics,1471-678X,1471-6798,NA,0,1,1,0,"Operations Research & Management Science | Mathematics, Interdisciplinary Applications","Management | Social Sciences, Mathematical Methods",NA,OXFORD UNIV PRESS,NA +ima journal of management mathematics,1471-678X,1471-6798,NA,0,1,1,0,"Operations Research & Management Science | Mathematics, Interdisciplinary Applications","Management | Social Sciences, Mathematical Methods",NA,OXFORD UNIV PRESS,NA +ima journal of mathematical control and information,0265-0754,1471-6887,NA,0,0,1,0,"Automation & Control Systems | Mathematics, Applied",NA,NA,OXFORD UNIV PRESS,NA +ima journal of numerical analysis,0272-4979,1464-3642,NA,0,0,1,0,"Mathematics, Applied",NA,NA,OXFORD UNIV PRESS,NA +image analysis & stereology,1580-3139,1854-5165,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mathematics, Applied | Mechanics",NA,NA,INT SOC STEREOLOGY,NA +image and vision computing,0262-8856,1872-8138,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Software Engineering | Computer Science, Theory & Methods | Engineering, Electrical & Electronic | Optics",NA,NA,ELSEVIER,NA +imaging science journal,1368-2199,1743-131X,NA,0,0,1,0,Imaging Science & Photographic Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +imago mundi-the international journal for the history of cartography,0308-5694,1479-7801,imagomundiijhc,1,1,0,1,NA,History | History & Philosophy Of Science | Geography | History Of Social Sciences,History & Philosophy Of Science | History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-08-05 +imago mundi-the international journal for the history of cartography,0308-5694,1479-7801,imagomundiijhc,1,1,0,1,NA,History | History & Philosophy Of Science | Geography | History Of Social Sciences,History & Philosophy Of Science | History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-08-05 +imago temporis-medium aevum,1888-3931,2340-7778,NA,1,0,0,0,NA,NA,History | Medieval & Renaissance Studies,SPACE POWER & CULTURE- CONSOLIDATED MEDIEVAL SUTDIES RESEARCH GROUP,NA +imf economic review,2041-4161,2041-417X,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,PALGRAVE MACMILLAN LTD,NA +immune network,1598-2629,2092-6685,NA,0,0,1,0,Immunology,NA,NA,KOREA ASSOC IMMUNOLOGISTS,NA +immunity,1074-7613,1097-4180,NA,0,0,1,0,Immunology,NA,NA,CELL PRESS,NA +immunity & ageing,1742-4933,1742-4933,NA,0,0,1,0,Geriatrics & Gerontology | Immunology,NA,NA,BMC,NA +immunity inflammation and disease,2050-4527,2050-4527,ImmunityAnd,0,0,1,1,Immunology,NA,NA,WILEY,2019-05-02 +immunobiology,0171-2985,1878-3279,NA,0,0,1,0,Immunology,NA,NA,ELSEVIER GMBH,NA +immunogenetics,0093-7711,1432-1211,NA,0,0,1,0,Genetics & Heredity | Immunology,NA,NA,SPRINGER,NA +immunologic research,0257-277X,1559-0755,NA,0,0,1,0,Immunology,NA,NA,HUMANA PRESS INC,NA +immunological investigations,0882-0139,1532-4311,NA,0,0,1,0,Immunology,NA,NA,TAYLOR & FRANCIS INC,NA +immunological reviews,0105-2896,1600-065X,NA,0,0,1,0,Immunology,NA,NA,WILEY,NA +immunology,0019-2805,1365-2567,NA,0,0,1,0,Immunology,NA,NA,WILEY,NA +immunology and allergy clinics of north america,0889-8561,1557-8607,NA,0,0,1,0,Allergy | Immunology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +immunology and cell biology,0818-9641,1440-1711,ImmunolCellBiol,0,0,1,1,Cell Biology | Immunology,NA,NA,WILEY,2017-10-20 +immunology letters,0165-2478,1879-0542,NA,0,0,1,0,Immunology,NA,NA,ELSEVIER,NA +immunopharmacology and immunotoxicology,0892-3973,1532-2513,NA,0,0,1,0,Immunology | Pharmacology & Pharmacy | Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +immunotherapy,1750-743X,1750-7448,fsgimt,0,0,1,1,Immunology,NA,NA,FUTURE MEDICINE LTD,2014-07-22 +impact assessment and project appraisal,1461-5517,1471-5465,NA,0,1,0,0,NA,Environmental Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +implant dentistry,1056-6163,1056-6163,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +implantologie,0943-9692,0943-9692,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENZ VERLAGS-GMBH,NA +implementation science,1748-5908,1748-5908,ImplementSci,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,BMC,2010-11-19 +implementation science,1748-5908,1748-5908,ImplementSci,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,BMC,2010-11-19 +in practice,0263-841X,2042-7689,NA,0,0,1,0,Veterinary Sciences,NA,NA,JOHN WILEY & SONS LTD,NA +in vitro cellular & developmental biology-animal,1071-2690,1543-706X,NA,0,0,1,0,Cell Biology | Developmental Biology,NA,NA,SPRINGER,NA +in vitro cellular & developmental biology-plant,1054-5476,1475-2689,NA,0,0,1,0,Plant Sciences | Cell Biology | Developmental Biology,NA,NA,SPRINGER,NA +in vivo,0258-851X,1791-7549,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,INT INST ANTICANCER RESEARCH,NA +indagationes mathematicae-new series,0019-3577,1872-6100,NA,0,0,1,0,Mathematics,NA,NA,ELSEVIER,NA +independent review,1086-1653,NA,NA,0,1,0,0,NA,Economics | Political Science,NA,INDEPENDENT INST,NA +index on censorship,0306-4220,1746-6067,IndexCensorship,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",SAGE PUBLICATIONS LTD,2009-01-22 +india review,1473-6489,1557-3036,NA,0,1,0,0,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +indian economic and social history review,0019-4646,0973-0893,NA,1,1,0,0,NA,History,History,SAGE PUBLICATIONS INDIA PVT LTD,NA +indian economic and social history review,0019-4646,0973-0893,NA,1,1,0,0,NA,History,History,SAGE PUBLICATIONS INDIA PVT LTD,NA +indian historical review,0376-9836,0975-5977,NA,1,0,0,0,NA,NA,History | Asian Studies,SAGE PUBLICATIONS INDIA PVT LTD,NA +indian journal of agricultural sciences,0019-5022,2394-3319,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,INDIAN COUNC AGRICULTURAL RES,NA +indian journal of animal research,0367-6722,0367-6722,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,AGRICULTURAL RESEARCH COMMUNICATION CENTRE,NA +indian journal of animal sciences,0367-8318,0367-8318,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,INDIAN COUNC AGRICULTURAL RES,NA +indian journal of biochemistry & biophysics,0301-1208,0975-0959,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of biotechnology,0972-5849,0975-0967,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of cancer,0019-509X,1998-4774,IndJCancer,0,0,1,1,Oncology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2020-05-13 +indian journal of chemical technology,0971-457X,0975-0991,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical",NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of chemistry section a-inorganic bio-inorganic physical theoretical & analytical chemistry,0376-4710,0975-0975,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of chemistry section b-organic chemistry including medicinal chemistry,0376-4699,0019-5103,NA,0,0,1,0,"Chemistry, Organic",NA,NA,"NATL INST SCIENCE COMMUNICATION & INFORMATION RESOURCES-NISCAIR",NA +indian journal of dermatology,0019-5154,1998-3611,ijdermatology,0,0,1,1,Dermatology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2021-09-14 +indian journal of dermatology venereology & leprology,0378-6323,0973-3922,NA,0,0,1,0,Dermatology,NA,NA,SCIENTIFIC SCHOLAR LLC,NA +indian journal of engineering and materials sciences,0971-4588,0975-1017,NA,0,0,1,0,"Engineering, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of experimental biology,0019-5189,0975-1009,NA,0,0,1,0,Biology,NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of fibre & textile research,0971-0426,0975-1025,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of fisheries,0970-6011,NA,NA,0,0,1,0,Fisheries,NA,NA,CENTRAL MARINE FISHERIES RESEARCH INST,NA +indian journal of gender studies,0971-5215,0973-0672,NA,0,1,0,0,NA,Women'S Studies,NA,SAGE PUBLICATIONS INDIA PVT LTD,NA +indian journal of genetics and plant breeding,0019-5200,0975-6906,NA,0,0,1,0,Plant Sciences,NA,NA,INDIAN SOC GENET PLANT BREEDING,NA +indian journal of geo-marine sciences,0379-5136,0975-1033,NA,0,0,1,0,Oceanography,NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of hematology and blood transfusion,0971-4502,0974-0449,NA,0,0,1,0,Hematology,NA,NA,SPRINGER INDIA,NA +indian journal of heterocyclic chemistry,0971-1627,0971-1627,NA,0,0,1,0,"Chemistry, Organic",NA,NA,CONNECT JOURNALS,NA +indian journal of medical microbiology,0255-0857,1998-3646,NA,0,0,1,0,Immunology,NA,NA,ELSEVIER,NA +indian journal of medical research,0971-5916,0971-5916,NA,0,0,1,0,"Immunology | Medicine, General & Internal | Medicine, Research & Experimental",NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +indian journal of microbiology,0046-8991,0973-7715,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,SPRINGER,NA +indian journal of ophthalmology,0301-4738,1998-3689,IJOEditor,0,0,1,1,Ophthalmology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2016-09-30 +indian journal of orthopaedics,0019-5413,1998-3727,IJO_social,0,0,1,1,Orthopedics,NA,NA,SPRINGER HEIDELBERG,2020-09-03 +indian journal of pathology and microbiology,0377-4929,0974-5130,IJPMSoMe,0,0,1,1,Pathology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2022-01-28 +indian journal of pediatrics,0019-5456,0973-7693,INDIANJOURNALO4,0,0,1,1,Pediatrics,NA,NA,SPRINGER INDIA,2020-02-21 +indian journal of pharmaceutical education and research,0019-5464,0019-5464,NA,0,0,1,0,"Education, Scientific Disciplines | Pharmacology & Pharmacy",NA,NA,ASSOC PHARMACEUTICAL TEACHERS INDIA,NA +indian journal of pharmaceutical sciences,0250-474X,1998-3743,IndianJPharmSci,0,0,1,1,Pharmacology & Pharmacy,NA,NA,INDIAN PHARMACEUTICAL ASSOC,2016-12-29 +indian journal of pharmacology,0253-7613,1998-3751,of_pharmacology,0,0,1,1,Pharmacology & Pharmacy,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2019-07-02 +indian journal of physics,0973-1458,0974-9845,PhysicsIndian,0,0,1,1,"Physics, Multidisciplinary",NA,NA,INDIAN ASSOC CULTIVATION SCIENCE,2021-09-16 +indian journal of psychiatry,0019-5545,1998-3794,IndJSocialPsy,0,1,1,1,Psychiatry,Psychiatry,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2020-10-01 +indian journal of psychiatry,0019-5545,1998-3794,IndJSocialPsy,0,1,1,1,Psychiatry,Psychiatry,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2020-10-01 +indian journal of public health,0019-557X,2229-7693,jour_pub_health,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2021-09-14 +indian journal of public health,0019-557X,2229-7693,jour_pub_health,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2021-09-14 +indian journal of pure & applied mathematics,0019-5588,0975-7465,NA,0,0,1,0,Mathematics,NA,NA,INDIAN NAT SCI ACAD,NA +indian journal of pure & applied physics,0019-5596,0975-1041,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian journal of surgery,0972-2068,0973-9793,NA,0,0,1,0,Surgery,NA,NA,SPRINGER INDIA,NA +indian journal of traditional knowledge,0972-5938,0975-1068,NA,0,0,1,0,Plant Sciences,NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +indian pediatrics,0019-6061,0974-7559,EditorIndPed,0,0,1,1,Pediatrics,NA,NA,SPRINGER INDIA,2015-10-04 +indiana law journal,0019-6665,2169-3218,indianalj,0,1,0,1,NA,Law,NA,INDIANA LAW JOURNAL,2017-04-05 +indiana university mathematics journal,0022-2518,1943-5258,NA,0,0,1,0,Mathematics,NA,NA,INDIANA UNIV MATH JOURNAL,NA +indo-iranian journal,0019-7246,1572-8536,NA,1,0,0,0,NA,NA,Asian Studies,BRILL,NA +indogermanische forschungen,0019-7262,1613-0405,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +indogermanische forschungen,0019-7262,1613-0405,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +indonesia and the malay world,1363-9811,1469-8382,IndonesiaMalayW,1,0,0,1,NA,NA,Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-05-21 +indoor air,0905-6947,1600-0668,NA,0,0,1,0,"Construction & Building Technology | Engineering, Environmental | Public, Environmental & Occupational Health",NA,NA,WILEY,NA +indoor and built environment,1420-326X,1423-0070,NA,0,0,1,0,"Construction & Building Technology | Engineering, Environmental | Public, Environmental & Occupational Health",NA,NA,SAGE PUBLICATIONS LTD,NA +industria textila,1222-5347,NA,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,INST NATL CERCETARE-DEZVOLTARE TEXTILE PIELARIE-BUCURESTI,NA +industrial & engineering chemistry research,0888-5885,1520-5045,NA,0,0,1,0,"Engineering, Chemical",NA,NA,AMER CHEMICAL SOC,NA +industrial and corporate change,0960-6491,1464-3650,NA,0,1,0,0,NA,Business | Economics | Management,NA,OXFORD UNIV PRESS,NA +industrial and organizational psychology-perspectives on science and practice,1754-9426,1754-9434,NA,0,1,0,0,NA,"Psychology, Applied",NA,CAMBRIDGE UNIV PRESS,NA +industrial archaeology review,0309-0728,1745-8196,NA,1,0,0,0,NA,NA,History | Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +industrial crops and products,0926-6690,1872-633X,NA,0,0,1,0,Agricultural Engineering | Agronomy,NA,NA,ELSEVIER,NA +industrial health,0019-8366,1880-8026,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health | Toxicology",NA,NA,"NATL INST OCCUPATIONAL SAFETY & HEALTH, JAPAN",NA +industrial law journal,0305-9332,1464-3669,NA,0,1,0,0,NA,Industrial Relations & Labor | Law,NA,OXFORD UNIV PRESS,NA +industrial lubrication and tribology,0036-8792,1758-5775,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +industrial management & data systems,0263-5577,1758-5783,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Industrial",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +industrial marketing management,0019-8501,1873-2062,NA,0,1,0,0,NA,Business | Management,NA,ELSEVIER SCIENCE INC,NA +industrial relations,0019-8676,1468-232X,NA,0,1,0,0,NA,Industrial Relations & Labor,NA,WILEY,NA +industrial robot-the international journal of robotics research and application,0143-991X,1758-5791,NA,0,0,1,0,"Engineering, Industrial | Robotics",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +industry and innovation,1366-2716,1469-8390,NA,0,1,0,0,NA,Economics | Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +infancy,1525-0008,1532-7078,NA,0,1,0,0,NA,"Psychology, Development",NA,WILEY,NA +infant and child development,1522-7227,1522-7219,ICDjournal,0,1,0,1,NA,"Psychology, Development",NA,WILEY,2015-10-10 +infant behavior & development,0163-6383,1879-0453,NA,0,1,0,0,NA,"Psychology, Development",NA,ELSEVIER SCIENCE INC,NA +infant mental health journal,0163-9641,1097-0355,IMHJournal,0,1,0,1,NA,"Psychology, Development",NA,WILEY,2018-05-15 +infants & young children,0896-3746,1550-5081,NA,0,1,0,0,NA,"Education, Special | Psychology, Development | Rehabilitation",NA,LIPPINCOTT WILLIAMS & WILKINS,NA +infection,0300-8126,1439-0973,NA,0,0,1,0,Infectious Diseases,NA,NA,SPRINGER HEIDELBERG,NA +infection and drug resistance,1178-6973,1178-6973,NA,0,0,1,0,Infectious Diseases | Pharmacology & Pharmacy,NA,NA,DOVE MEDICAL PRESS LTD,NA +infection and immunity,0019-9567,1098-5522,NA,0,0,1,0,Immunology | Infectious Diseases,NA,NA,AMER SOC MICROBIOLOGY,NA +infection control and hospital epidemiology,0899-823X,1559-6834,NA,0,0,1,0,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,CAMBRIDGE UNIV PRESS,NA +infection genetics and evolution,1567-1348,1567-7257,NA,0,0,1,0,Infectious Diseases,NA,NA,ELSEVIER,NA +infectious agents and cancer,1750-9378,1750-9378,NA,0,0,1,0,Oncology | Immunology,NA,NA,BMC,NA +infectious disease clinics of north america,0891-5520,1557-9824,NA,0,0,1,0,Immunology | Infectious Diseases,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +infectious diseases,2374-4235,2374-4243,NA,0,0,1,0,Infectious Diseases,NA,NA,TAYLOR & FRANCIS LTD,NA +infectious diseases and therapy,2193-8229,2193-6382,InfectDis_Ther,0,0,1,1,Infectious Diseases,NA,NA,SPRINGER LONDON LTD,2017-07-18 +infectious diseases now,2666-9927,2666-9919,InfDiseasesNow,0,0,1,1,Infectious Diseases,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,2018-11-01 +infectious diseases of poverty,2095-5162,2049-9957,Idpbmc2012,0,0,1,1,Infectious Diseases | Parasitology | Tropical Medicine,NA,NA,BMC,2019-09-11 +infini,0754-023X,NA,NA,1,0,0,0,NA,NA,Literary Reviews,EDITIONS GALLIMARD,NA +infinite dimensional analysis quantum probability and related topics,0219-0257,1793-6306,NA,0,0,1,0,"Mathematics, Applied | Quantum Science & Technology | Physics, Mathematical | Statistics & Probability",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +inflammation,0360-3997,1573-2576,NA,0,0,1,0,Cell Biology | Immunology,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +inflammation and regeneration,1880-8190,1880-8190,NA,0,0,1,0,"Immunology | Medicine, Research & Experimental",NA,NA,BMC,NA +inflammation research,1023-3830,1420-908X,NA,0,0,1,0,Cell Biology | Immunology,NA,NA,SPRINGER BASEL AG,NA +inflammatory bowel diseases,1078-0998,1536-4844,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,OXFORD UNIV PRESS INC,NA +inflammopharmacology,0925-4692,1568-5608,NA,0,0,1,0,Immunology | Toxicology,NA,NA,SPRINGER BASEL AG,NA +influenza and other respiratory viruses,1750-2640,1750-2659,NA,0,0,1,0,Infectious Diseases | Virology,NA,NA,WILEY,NA +infomat,2567-3165,2567-3165,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,WILEY,NA +infor,0315-5986,1916-0615,infor_journal,0,0,1,1,"Computer Science, Information Systems | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS INC,2016-11-10 +informacao & sociedade-estudos,0104-0146,1809-4783,NA,0,1,0,0,NA,Information Science & Library Science,NA,UNIV FEDERAL CAMPINA GRANDE,NA +informacije midem-journal of microelectronics electronic components and materials,0352-9045,0352-9045,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary",NA,NA,"SOC MICROELECTRONICS, ELECTRON COMPONENTS MATERIALS-MIDEM",NA +informacios tarsadalom,1587-8694,NA,NA,0,1,0,0,NA,Information Science & Library Science,NA,INFONIA,NA +informal logic,0824-2577,0824-2577,LogicInformal,1,0,0,1,NA,NA,Philosophy,"UNIV WINDSOR, DEPT PHILOSOPHY",2018-06-12 +informatica,0868-4952,1822-8844,NA,0,0,1,0,"Computer Science, Information Systems | Mathematics, Applied",NA,NA,INST MATHEMATICS & INFORMATICS,NA +informatics for health & social care,1753-8157,1753-8165,InformaticsCare,0,0,1,1,Health Care Sciences & Services | Medical Informatics,NA,NA,TAYLOR & FRANCIS INC,2021-02-12 +information & culture,2164-8034,2166-3033,infoandculture,1,1,0,1,NA,History Of Social Sciences | Information Science & Library Science,History,UNIV TEXAS PRESS,2021-02-08 +information & culture,2164-8034,2166-3033,infoandculture,1,1,0,1,NA,History Of Social Sciences | Information Science & Library Science,History,UNIV TEXAS PRESS,2021-02-08 +information & management,0378-7206,1872-7530,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,ELSEVIER,NA +information & management,0378-7206,1872-7530,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,ELSEVIER,NA +information and computation,0890-5401,1090-2651,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +information and organization,1471-7727,1873-7919,NA,0,1,0,0,NA,Information Science & Library Science | Management,NA,ELSEVIER SCI LTD,NA +information and software technology,0950-5849,1873-6025,ISTJrnal,0,0,1,1,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,ELSEVIER,2016-05-03 +information communication & society,1369-118X,1468-4462,NA,0,1,0,0,NA,Communication | Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +information development,0266-6669,1741-6469,NA,0,1,0,0,NA,Information Science & Library Science,NA,SAGE PUBLICATIONS LTD,NA +information economics and policy,0167-6245,1873-5975,IEP_Journal,0,1,0,1,NA,Economics,NA,ELSEVIER,2020-05-18 +information fusion,1566-2535,1872-6305,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +information processing & management,0306-4573,1873-5371,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,ELSEVIER SCI LTD,NA +information processing & management,0306-4573,1873-5371,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,ELSEVIER SCI LTD,NA +information processing letters,0020-0190,1872-6119,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,ELSEVIER,NA +information research-an international electronic journal,1368-1613,1368-1613,NA,0,1,0,0,NA,Information Science & Library Science,NA,UNIV SHEFFIELD DEPT INFORMATION STUDIES,NA +information retrieval journal,1386-4564,1573-7659,SpringerIRJ,0,0,1,1,"Computer Science, Information Systems",NA,NA,SPRINGER,2017-12-31 +information sciences,0020-0255,1872-6291,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,ELSEVIER SCIENCE INC,NA +information society,0197-2243,1087-6537,NA,0,1,0,0,NA,Communication | Information Science & Library Science,NA,TAYLOR & FRANCIS INC,NA +information systems,0306-4379,1873-6076,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +information systems and e-business management,1617-9846,1617-9854,NA,0,1,0,0,NA,Business | Management,NA,SPRINGER HEIDELBERG,NA +information systems frontiers,1387-3326,1572-9419,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +information systems journal,1350-1917,1365-2575,NA,0,1,0,0,NA,Information Science & Library Science,NA,WILEY,NA +information systems management,1058-0530,1934-8703,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,TAYLOR & FRANCIS INC,NA +information systems research,1047-7047,1526-5536,NA,0,1,0,0,NA,Information Science & Library Science | Management,NA,INFORMS,NA +information technology & management,1385-951X,1573-7667,NA,0,1,0,0,NA,Information Science & Library Science | Management,NA,SPRINGER,NA +information technology & people,0959-3845,1758-5813,NA,0,1,0,0,NA,Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +information technology & tourism,1098-3058,1943-4294,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,SPRINGER HEIDELBERG,NA +information technology and control,1392-124X,2335-884X,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,KAUNAS UNIV TECHNOLOGY,NA +information technology and libraries,0730-9295,2163-5226,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,AMER LIBRARY ASSOC,NA +information technology and libraries,0730-9295,2163-5226,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,AMER LIBRARY ASSOC,NA +information technology for development,0268-1102,1554-0170,InfoTechDev,0,1,0,1,NA,Development Studies | Information Science & Library Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-01-20 +information visualization,1473-8716,1473-8724,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,SAGE PUBLICATIONS LTD,NA +informes de la construccion,0020-0883,1988-3234,NA,0,0,1,0,Construction & Building Technology,NA,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +informs journal on applied analytics,2644-0865,2644-0873,NA,0,1,1,0,Operations Research & Management Science,Management,NA,INFORMS,NA +informs journal on applied analytics,2644-0865,2644-0873,NA,0,1,1,0,Operations Research & Management Science,Management,NA,INFORMS,NA +informs journal on computing,1091-9856,1526-5528,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Operations Research & Management Science",NA,NA,INFORMS,NA +infrared physics & technology,1350-4495,1879-0275,NA,0,0,1,0,"Instruments & Instrumentation | Optics | Physics, Applied",NA,NA,ELSEVIER,NA +ingegneria sismica,0393-1420,NA,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological",NA,NA,PATRON EDITORE S R L,NA +ingenieria e investigacion,0120-5609,2248-8723,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,"UNIV NAC COLOMBIA, FAC INGENIERIA",NA +inhalation toxicology,0895-8378,1091-7691,NA,0,0,1,0,Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +injury-international journal of the care of the injured,0020-1383,1879-0267,NA,0,0,1,0,Critical Care Medicine | Emergency Medicine | Orthopedics | Surgery,NA,NA,ELSEVIER SCI LTD,NA +injury epidemiology,2197-1714,2197-1714,InjuryEpi,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,2019-08-09 +injury epidemiology,2197-1714,2197-1714,InjuryEpi,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,2019-08-09 +injury prevention,1353-8047,1475-5785,IP_BMJ,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMJ PUBLISHING GROUP,2010-04-16 +injury prevention,1353-8047,1475-5785,IP_BMJ,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMJ PUBLISHING GROUP,2010-04-16 +inland water biology,1995-0829,1995-0837,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +inland waters,2044-2041,2044-205X,NA,0,0,1,0,Limnology | Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +innate immunity,1753-4259,1753-4267,NA,0,0,1,0,"Biochemistry & Molecular Biology | Immunology | Medicine, Research & Experimental | Microbiology",NA,NA,SAGE PUBLICATIONS LTD,NA +innovation-organization & management,1447-9338,2204-0226,InnoEuJnl,0,1,0,1,NA,Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-10-05 +innovation-the european journal of social science research,1351-1610,1469-8412,NA,0,1,0,0,NA,Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +innovations in education and teaching international,1470-3297,1470-3300,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +innovative food science & emerging technologies,1466-8564,1878-5522,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER SCI LTD,NA +inorganic and nano-metal chemistry,2470-1556,2470-1564,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Nanoscience & Nanotechnology",NA,NA,TAYLOR & FRANCIS INC,NA +inorganic chemistry,0020-1669,1520-510X,InorgChem,0,0,1,1,"Chemistry, Inorganic & Nuclear",NA,NA,AMER CHEMICAL SOC,2012-05-18 +inorganic chemistry communications,1387-7003,1879-0259,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,ELSEVIER,NA +inorganic chemistry frontiers,2052-1553,2052-1553,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,ROYAL SOC CHEMISTRY,NA +inorganic materials,0020-1685,1608-3172,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +inorganica chimica acta,0020-1693,1873-3255,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,ELSEVIER SCIENCE SA,NA +inorganics,2304-6740,2304-6740,inorganics_MDPI,0,0,1,1,"Chemistry, Inorganic & Nuclear",NA,NA,MDPI,2016-01-29 +inquiry-an interdisciplinary journal of philosophy,0020-174X,1502-3923,NA,1,1,0,0,NA,Ethics,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +inquiry-an interdisciplinary journal of philosophy,0020-174X,1502-3923,NA,1,1,0,0,NA,Ethics,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +inquiry-the journal of health care organization provision and financing,0046-9580,1945-7243,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,SAGE PUBLICATIONS INC,NA +inquiry-the journal of health care organization provision and financing,0046-9580,1945-7243,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,SAGE PUBLICATIONS INC,NA +inra productions animales,2273-774X,2273-7766,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,INST NATL RECHERCHE AGRONOMIQUE,NA +insect biochemistry and molecular biology,0965-1748,1879-0240,NA,0,0,1,0,Biochemistry & Molecular Biology | Entomology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +insect conservation and diversity,1752-458X,1752-4598,InsectDiversity,0,0,1,1,Entomology,NA,NA,WILEY,2014-06-06 +insect molecular biology,0962-1075,1365-2583,InsectMolecBio,0,0,1,1,Biochemistry & Molecular Biology | Entomology,NA,NA,WILEY,2018-04-12 +insect science,1672-9609,1744-7917,NA,0,0,1,0,Entomology,NA,NA,WILEY,NA +insect systematics & evolution,1399-560X,1876-312X,NA,0,0,1,0,Evolutionary Biology | Entomology,NA,NA,BRILL,NA +insect systematics and diversity,2399-3421,2399-3421,NA,0,0,1,0,Entomology,NA,NA,OXFORD UNIV PRESS INC,NA +insectes sociaux,0020-1812,1420-9098,InsSociaux,0,0,1,1,Entomology,NA,NA,SPRINGER BASEL AG,2015-05-02 +insects,2075-4450,2075-4450,Insects_MDPI,0,0,1,1,Entomology,NA,NA,MDPI,2016-01-13 +insight,1354-2575,1754-4904,NA,0,0,1,0,"Instruments & Instrumentation | Materials Science, Characterization, Testing",NA,NA,BRITISH INST NON-DESTRUCTIVE TESTING,NA +insights into imaging,1869-4101,1869-4101,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +instructional science,0020-4277,1573-1952,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,SPRINGER,NA +instrumentation science & technology,1073-9149,1525-6030,NA,0,0,1,0,"Chemistry, Analytical | Instruments & Instrumentation",NA,NA,TAYLOR & FRANCIS INC,NA +instruments and experimental techniques,0020-4412,1608-3180,NA,0,0,1,0,"Engineering, Multidisciplinary | Instruments & Instrumentation",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +insula-revista de letras y ciencias humanas,0020-4536,NA,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,INSULA LIBRERIA EDIC PUBL SA,NA +insurance mathematics & economics,0167-6687,1873-5959,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,ELSEVIER,NA +insurance mathematics & economics,0167-6687,1873-5959,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,ELSEVIER,NA +integral equations and operator theory,0378-620X,1420-8989,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER BASEL AG,NA +integral transforms and special functions,1065-2469,1476-8291,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,TAYLOR & FRANCIS LTD,NA +integrated computer-aided engineering,1069-2509,1875-8835,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications | Engineering, Multidisciplinary",NA,NA,IOS PRESS,NA +integrated environmental assessment and management,1551-3777,1551-3793,ieam_editor,0,0,1,1,Environmental Sciences | Toxicology,NA,NA,WILEY,2012-11-12 +integrated ferroelectrics,1058-4587,1607-8489,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied | Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,NA +integrating materials and manufacturing innovation,2193-9764,2193-9772,NA,0,0,1,0,"Engineering, Manufacturing | Materials Science, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +integration-the vlsi journal,0167-9260,1872-7522,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic",NA,NA,ELSEVIER,NA +integrative and comparative biology,1540-7063,1557-7023,NA,0,0,1,0,Zoology,NA,NA,OXFORD UNIV PRESS INC,NA +integrative biology,1757-9694,1757-9708,NA,0,0,1,0,Cell Biology,NA,NA,OXFORD UNIV PRESS,NA +integrative cancer therapies,1534-7354,1552-695X,NA,0,0,1,0,Oncology | Integrative & Complementary Medicine,NA,NA,SAGE PUBLICATIONS INC,NA +integrative medicine research,2213-4220,2213-4239,Integr_Med_Res,0,0,1,1,Integrative & Complementary Medicine,NA,NA,ELSEVIER,2017-04-05 +integrative organismal biology,NA,2517-4843,iobopen,0,0,1,1,Biology | Evolutionary Biology | Zoology,NA,NA,OXFORD UNIV PRESS,2018-08-23 +integrative psychological and behavioral science,1932-4502,1936-3567,NA,0,1,0,0,NA,"Psychology, Biological",NA,SPRINGER,NA +integrative zoology,1749-4877,1749-4869,NA,0,0,1,0,Zoology,NA,NA,WILEY,NA +intellectual and developmental disabilities,1934-9491,1934-9556,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,AMER ASSOC INTELLECTUAL DEVELOPMENTAL DISABILITIES,NA +intelligence,0160-2896,1873-7935,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,ELSEVIER SCIENCE INC,NA +intelligence and national security,0268-4527,1743-9019,intelnatsecjnl,0,1,0,1,NA,History | International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-08-13 +intelligent automation and soft computing,1079-8587,2326-005X,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Artificial Intelligence",NA,NA,TECH SCIENCE PRESS,NA +intelligent data analysis,1088-467X,1571-4128,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,IOS PRESS,NA +intelligent service robotics,1861-2776,1861-2784,NA,0,0,1,0,Robotics,NA,NA,SPRINGER HEIDELBERG,NA +intensive and critical care nursing,0964-3397,1532-4036,ICCNursJournal,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCI LTD,2020-01-28 +intensive and critical care nursing,0964-3397,1532-4036,ICCNursJournal,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCI LTD,2020-01-28 +intensive care medicine,0342-4642,1432-1238,yourICM,0,0,1,1,Critical Care Medicine,NA,NA,SPRINGER,2012-12-14 +inter-asia cultural studies,1464-9373,1469-8447,NA,1,1,0,0,NA,Cultural Studies | Anthropology,Cultural Studies | Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +inter-asia cultural studies,1464-9373,1469-8447,NA,1,1,0,0,NA,Cultural Studies | Anthropology,Cultural Studies | Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +interacting with computers,0953-5438,1873-7951,NA,0,1,1,0,"Computer Science, Cybernetics",Ergonomics,NA,OXFORD UNIV PRESS,NA +interacting with computers,0953-5438,1873-7951,NA,0,1,1,0,"Computer Science, Cybernetics",Ergonomics,NA,OXFORD UNIV PRESS,NA +interaction studies,1572-0373,1572-0381,NA,0,1,0,0,NA,Communication | Linguistics,NA,JOHN BENJAMINS PUBLISHING CO,NA +interactive cardiovascular and thoracic surgery,1569-9293,1569-9285,NA,0,0,1,0,Cardiac & Cardiovascular System | Respiratory System | Surgery,NA,NA,OXFORD UNIV PRESS,NA +interactive learning environments,1049-4820,1744-5191,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +interciencia,0378-1844,0378-1844,RevInterciencia,0,0,1,1,Ecology,NA,NA,INTERCIENCIA,2012-03-18 +intercultural pragmatics,1612-295X,1613-365X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +intercultural pragmatics,1612-295X,1613-365X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +interdisciplinary science reviews,0308-0188,1743-2790,IntSciReviews,0,1,1,1,Multidisciplinary Sciences,"Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-10-17 +interdisciplinary science reviews,0308-0188,1743-2790,IntSciReviews,0,1,1,1,Multidisciplinary Sciences,"Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-10-17 +interdisciplinary sciences-computational life sciences,1913-2751,1867-1462,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,SPRINGER HEIDELBERG,NA +interdisciplinary studies of literature,2520-4920,2616-4566,NA,1,0,0,0,NA,NA,Literature,KNOWLEDGE HUB PUBL CO LTD,NA +interface focus,2042-8898,2042-8901,NA,0,0,1,0,Biology,NA,NA,ROYAL SOC,NA +interfaces and free boundaries,1463-9963,1463-9971,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +interiors-design architecture culture,2041-9112,2041-9120,NA,1,0,0,0,NA,NA,Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +intermetallics,0966-9795,1879-0216,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,ELSEVIER SCI LTD,NA +internal and emergency medicine,1828-0447,1970-9366,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +internal medicine,0918-2918,1349-7235,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,JAPAN SOC INTERNAL MEDICINE,NA +internal medicine journal,1444-0903,1445-5994,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,WILEY,NA +internasjonal politikk,0020-577X,1891-1757,tidsskriftet_ip,0,1,0,1,NA,International Relations | Political Science,NA,NORSK UTENRIKSPOLITISK INST,2015-12-01 +international & comparative law quarterly,0020-5893,1471-6895,iclq_jnl,0,1,0,1,NA,Law,NA,CAMBRIDGE UNIV PRESS,2016-01-25 +international affairs,0020-5850,1468-2346,iajournal_ch,0,1,0,1,NA,International Relations,NA,OXFORD UNIV PRESS,2014-01-07 +international agrophysics,0236-8722,2300-8725,NA,0,0,1,0,Agronomy,NA,NA,"POLISH ACAD SCIENCES, INST AGROPHYSICS",NA +international angiology,0392-9590,1827-1839,IntAngiology,0,0,1,1,Peripheral Vascular Diseases,NA,NA,EDIZIONI MINERVA MEDICA,2020-04-24 +international arab journal of information technology,1683-3198,1683-3198,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Engineering, Electrical & Electronic",NA,NA,ZARKA PRIVATE UNIV,NA +international archives of allergy and immunology,1018-2438,1423-0097,NA,0,0,1,0,Allergy | Immunology,NA,NA,KARGER,NA +international archives of occupational and environmental health,0340-0131,1432-1246,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,SPRINGER,NA +international biodeterioration & biodegradation,0964-8305,1879-0208,ibbs_online,0,0,1,1,Biotechnology & Applied Microbiology | Environmental Sciences,NA,NA,ELSEVIER SCI LTD,2016-02-26 +international braz j urol,1677-5538,1677-6119,NA,0,0,1,0,Urology & Nephrology,NA,NA,BRAZILIAN SOC UROL,NA +international breastfeeding journal,1746-4358,1746-4358,NA,0,0,1,0,Obstetrics & Gynecology | Pediatrics,NA,NA,BMC,NA +international business review,0969-5931,1873-6149,NA,0,1,0,0,NA,Business,NA,ELSEVIER,NA +international clinical psychopharmacology,0268-1315,1473-5857,NA,0,0,1,0,Pharmacology & Pharmacy | Psychiatry,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +international communication gazette,1748-0485,1748-0493,NA,0,1,0,0,NA,Communication,NA,SAGE PUBLICATIONS INC,NA +international communications in heat and mass transfer,0735-1933,1879-0178,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international dairy journal,0958-6946,1879-0143,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER SCI LTD,NA +international data privacy law,2044-3994,2044-4001,NA,0,1,0,0,NA,Law,NA,OXFORD UNIV PRESS,NA +international dental journal,0020-6539,1875-595X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER,NA +international development planning review,1474-6743,1478-3401,NA,0,1,0,0,NA,Development Studies | Regional & Urban Planning,NA,LIVERPOOL UNIV PRESS,NA +international economic review,0020-6598,1468-2354,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +international emergency nursing,1755-599X,1878-013X,IntEmergNursJnl,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCI LTD,2013-10-24 +international emergency nursing,1755-599X,1878-013X,IntEmergNursJnl,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCI LTD,2013-10-24 +international endodontic journal,0143-2885,1365-2591,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +international entrepreneurship and management journal,1554-7191,1555-1938,NA,0,1,0,0,NA,Business | Management,NA,SPRINGER,NA +international environmental agreements-politics law and economics,1567-9764,1573-1553,NA,0,1,0,0,NA,Economics | Environmental Studies | Law | Political Science,NA,SPRINGER,NA +international feminist journal of politics,1461-6742,1468-4470,ifjpglobal,0,1,0,1,NA,Political Science | Women'S Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-04-04 +international finance,1367-0271,1468-2362,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,WILEY,NA +international food and agribusiness management review,1559-2448,1559-2448,NA,0,0,1,0,Agricultural Economics & Policy,NA,NA,WAGENINGEN ACADEMIC PUBLISHERS,NA +international food research journal,1985-4668,2231-7546,NA,0,0,1,0,Food Science & Technology,NA,NA,UNIV PUTRA MALAYSIA PRESS,NA +international forestry review,1465-5489,2053-7778,NA,0,0,1,0,Forestry,NA,NA,COMMONWEALTH FORESTRY ASSOC,NA +international forum of allergy & rhinology,2042-6976,2042-6984,ifar_journal,0,0,1,1,Otorhinolaryngology,NA,NA,WILEY,2019-02-15 +international gambling studies,1445-9795,1479-4276,NA,0,1,0,0,NA,Substance Abuse,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international geology review,0020-6814,1938-2839,NA,0,0,1,0,Geology,NA,NA,TAYLOR & FRANCIS INC,NA +international health,1876-3413,1876-3405,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +international health,1876-3413,1876-3405,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +international heart journal,1349-2365,1349-3299,journal_heart,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,INT HEART JOURNAL ASSOC,2021-04-14 +international history review,0707-5332,1949-6540,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international immunology,0953-8178,1460-2377,NA,0,0,1,0,Immunology,NA,NA,OXFORD UNIV PRESS,NA +international immunopharmacology,1567-5769,1878-1705,NA,0,0,1,0,Immunology | Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +international insolvency review,1180-0518,1099-1107,iir_insolvency,0,1,0,1,NA,"Business, Finance | Law",NA,WILEY,2017-08-13 +international interactions,0305-0629,1547-7444,ii_journal,0,1,0,1,NA,International Relations,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-05-27 +international journal,0020-7020,2052-465X,intl_journal,0,1,0,1,NA,International Relations,NA,SAGE PUBLICATIONS LTD,2018-08-28 +international journal for academic development,1360-144X,1470-1324,IntlJourAcadDev,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-02-18 +international journal for educational and vocational guidance,1873-0388,1573-1782,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Applied",NA,SPRINGER,NA +international journal for equity in health,1475-9276,1475-9276,equityhealthj,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,BMC,2014-08-04 +international journal for lesson and learning studies,2046-8253,2016-8261,NA,0,1,0,0,NA,Education & Educational Research,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal for multiscale computational engineering,1543-1649,1940-4352,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,BEGELL HOUSE INC,NA +international journal for numerical and analytical methods in geomechanics,0363-9061,1096-9853,NA,0,0,1,0,"Engineering, Geological | Materials Science, Multidisciplinary | Mechanics",NA,NA,WILEY,NA +international journal for numerical methods in biomedical engineering,2040-7939,2040-7947,NA,0,0,1,0,"Engineering, Biomedical | Mathematical & Computational Biology | Mathematics, Interdisciplinary Applications",NA,NA,WILEY,NA +international journal for numerical methods in engineering,0029-5981,1097-0207,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,WILEY,NA +international journal for numerical methods in fluids,0271-2091,1097-0363,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Mathematics, Interdisciplinary Applications | Mechanics | Physics, Fluids & Plasmas",NA,NA,WILEY,NA +international journal for parasitology,0020-7519,1879-0135,IJPara,0,0,1,1,Parasitology,NA,NA,ELSEVIER SCI LTD,2015-10-28 +international journal for parasitology-drugs and drug resistance,2211-3207,2211-3207,NA,0,0,1,0,Parasitology | Pharmacology & Pharmacy,NA,NA,ELSEVIER SCI LTD,NA +international journal for parasitology-parasites and wildlife,2213-2244,2213-2244,NA,0,0,1,0,Ecology | Parasitology,NA,NA,ELSEVIER,NA +international journal for philosophy of religion,0020-7047,1572-8684,NA,1,0,0,0,NA,NA,Religion | Philosophy,SPRINGER,NA +international journal for quality in health care,1353-4505,1464-3677,IJQHC_OUP,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,OXFORD UNIV PRESS,2020-05-22 +international journal for quality in health care,1353-4505,1464-3677,IJQHC_OUP,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,OXFORD UNIV PRESS,2020-05-22 +international journal for the psychology of religion,1050-8619,1532-7582,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal for the psychology of religion,1050-8619,1532-7582,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal for uncertainty quantification,2152-5080,2152-5099,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,BEGELL HOUSE INC,NA +international journal for vitamin and nutrition research,0300-9831,1664-2821,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,HOGREFE AG-HOGREFE AG SUISSE,NA +international journal of acarology,0164-7954,1945-3892,NA,0,0,1,0,Entomology,NA,NA,TAYLOR & FRANCIS INC,NA +international journal of accounting information systems,1467-0895,1873-4723,NA,0,1,0,0,NA,"Business | Business, Finance | Management",NA,ELSEVIER,NA +international journal of acoustics and vibration,1027-5851,2415-1408,NA,0,0,1,0,"Acoustics | Engineering, Mechanical | Mechanics",NA,NA,INT INST ACOUSTICS & VIBRATION,NA +international journal of ad hoc and ubiquitous computing,1743-8225,1743-8233,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of adaptive control and signal processing,0890-6327,1099-1115,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic",NA,NA,WILEY,NA +international journal of adhesion and adhesives,0143-7496,1879-0127,NA,0,0,1,0,"Engineering, Chemical | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +international journal of advanced manufacturing technology,0268-3768,1433-3015,NA,0,0,1,0,"Automation & Control Systems | Engineering, Manufacturing",NA,NA,SPRINGER LONDON LTD,NA +international journal of advanced robotic systems,1729-8814,1729-8814,NA,0,0,1,0,Robotics,NA,NA,SAGE PUBLICATIONS INC,NA +international journal of advertising,0265-0487,1759-3948,NA,0,1,0,0,NA,Business | Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of aeroacoustics,1475-472X,2048-4003,NA,0,0,1,0,"Acoustics | Engineering, Aerospace | Mechanics",NA,NA,SAGE PUBLICATIONS INC,NA +international journal of aeronautical and space sciences,2093-274X,2093-2480,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,SPRINGER,NA +international journal of aerospace engineering,1687-5966,1687-5974,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,HINDAWI LTD,NA +international journal of aerospace psychology,2472-1832,2472-1840,NA,0,1,0,0,NA,"Psychology, Applied",NA,TAYLOR & FRANCIS INC,NA +international journal of african historical studies,0361-7882,2326-3016,NA,1,0,0,0,NA,NA,History,AFRICAN STUDIES CENTER,NA +international journal of aging & human development,0091-4150,1541-3535,NA,0,1,0,0,NA,"Gerontology | Psychology, Development",NA,SAGE PUBLICATIONS INC,NA +international journal of agricultural and biological engineering,1934-6344,1934-6352,NA,0,0,1,0,Agricultural Engineering,NA,NA,CHINESE ACAD AGRICULTURAL ENGINEERING,NA +international journal of agricultural sustainability,1473-5903,1747-762X,NA,0,0,1,0,"Agriculture, Multidisciplinary | Green & Sustainable Science & Technology",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of agriculture and natural resources,2452-5731,2452-5731,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,"PONTIFICIA UNIV CATOLICA CHILE, FAC AGRONOMIA INGENIERIA FORESTAL",NA +international journal of algebra and computation,0218-1967,1793-6500,NA,0,0,1,0,Mathematics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of american linguistics,0020-7071,1545-7001,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,UNIV CHICAGO PRESS,NA +international journal of american linguistics,0020-7071,1545-7001,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,UNIV CHICAGO PRESS,NA +international journal of analytical chemistry,1687-8760,1687-8779,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,HINDAWI LTD,NA +international journal of antennas and propagation,1687-5869,1687-5877,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,HINDAWI LTD,NA +international journal of antimicrobial agents,0924-8579,1872-7913,NA,0,0,1,0,Infectious Diseases | Microbiology | Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +international journal of applied ceramic technology,1546-542X,1744-7402,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,WILEY,NA +international journal of applied earth observation and geoinformation,1569-8432,1872-826X,NA,0,0,1,0,Remote Sensing,NA,NA,ELSEVIER,NA +international journal of applied electromagnetics and mechanics,1383-5416,1875-8800,NA,0,0,1,0,"Engineering, Electrical & Electronic | Mechanics | Physics, Applied",NA,NA,IOS PRESS,NA +international journal of applied glass science,2041-1286,2041-1294,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,"WILEY PERIODICALS, INC",NA +international journal of applied linguistics,0802-6106,1473-4192,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,WILEY,NA +international journal of applied linguistics,0802-6106,1473-4192,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,WILEY,NA +international journal of applied mathematics and computer science,1641-876X,2083-8492,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Artificial Intelligence | Mathematics, Applied",NA,NA,SCIENDO,NA +international journal of applied mechanics,1758-8251,1758-826X,NA,0,0,1,0,Mechanics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of applied research in veterinary medicine,1542-2666,1559-470X,NA,0,0,1,0,Veterinary Sciences,NA,NA,VETERINARY SOLUTIONS LLC,NA +international journal of approximate reasoning,0888-613X,1873-4731,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,ELSEVIER SCIENCE INC,NA +international journal of architectural heritage,1558-3058,1558-3066,NA,1,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,Architecture,TAYLOR & FRANCIS INC,NA +international journal of architectural heritage,1558-3058,1558-3066,NA,1,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,Architecture,TAYLOR & FRANCIS INC,NA +international journal of art & design education,1476-8062,1476-8070,NA,1,1,0,0,NA,Education & Educational Research,Art,WILEY,NA +international journal of art & design education,1476-8062,1476-8070,NA,1,1,0,0,NA,Education & Educational Research,Art,WILEY,NA +international journal of artificial organs,0391-3988,1724-6040,NA,0,0,1,0,"Engineering, Biomedical | Transplantation",NA,NA,SAGE PUBLICATIONS LTD,NA +international journal of arts management,1480-8986,NA,IJAMjournal,1,1,0,1,NA,Management,"Humanities, Multidisciplinary",ECOLE DES HAUTES ETUDES COMMERCIALES DE MONTREAL,2021-11-02 +international journal of arts management,1480-8986,NA,IJAMjournal,1,1,0,1,NA,Management,"Humanities, Multidisciplinary",ECOLE DES HAUTES ETUDES COMMERCIALES DE MONTREAL,2021-11-02 +international journal of asian studies,1479-5914,1479-5922,NA,1,0,0,0,NA,NA,Asian Studies,CAMBRIDGE UNIV PRESS,NA +international journal of astrobiology,1473-5504,1475-3006,NA,0,0,1,0,"Astronomy & Astrophysics | Biology | Geosciences, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,NA +international journal of audiology,1499-2027,1708-8186,ijaonline,0,0,1,1,Audiology & Speech-Language Pathology | Otorhinolaryngology,NA,NA,TAYLOR & FRANCIS LTD,2018-11-24 +international journal of auditing,1090-6738,1099-1123,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +international journal of automotive technology,1229-9138,1976-3832,NA,0,0,1,0,"Engineering, Mechanical | Transportation Science & Technology",NA,NA,KOREAN SOC AUTOMOTIVE ENGINEERS-KSAE,NA +international journal of bank marketing,0265-2323,1758-5937,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of behavioral development,0165-0254,1464-0651,NA,0,1,0,0,NA,"Psychology, Development",NA,SAGE PUBLICATIONS LTD,NA +international journal of behavioral medicine,1070-5503,1532-7558,IJBMed,0,1,0,1,NA,"Psychology, Clinical",NA,SPRINGER,2018-08-26 +international journal of behavioral nutrition and physical activity,1479-5868,1479-5868,NA,0,0,1,0,Nutrition & Dietetics | Physiology,NA,NA,BMC,NA +international journal of bifurcation and chaos,0218-1274,1793-6551,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Multidisciplinary Sciences",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of bilingual education and bilingualism,1367-0050,1747-7522,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of bilingual education and bilingualism,1367-0050,1747-7522,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of bilingualism,1367-0069,1756-6878,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SAGE PUBLICATIONS LTD,NA +international journal of bilingualism,1367-0069,1756-6878,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SAGE PUBLICATIONS LTD,NA +international journal of bio-inspired computation,1758-0366,1758-0374,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of biochemistry & cell biology,1357-2725,1878-5875,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of biological macromolecules,0141-8130,1879-0003,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Applied | Polymer Science",NA,NA,ELSEVIER,NA +international journal of biological markers,0393-6155,1724-6008,NA,0,0,1,0,Biotechnology & Applied Microbiology | Oncology,NA,NA,SAGE PUBLICATIONS LTD,NA +international journal of biological sciences,1449-2288,1449-2288,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,IVYSPRING INT PUBL,NA +international journal of biomathematics,1793-5245,1793-7159,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of biometeorology,0020-7128,1432-1254,NA,0,0,1,0,Biophysics | Environmental Sciences | Meteorology & Atmospheric Sciences | Physiology,NA,NA,SPRINGER,NA +international journal of bioprinting,2424-7723,2424-8002,IJB_Whioce,0,0,1,1,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,"WHIOCE PUBLISHING PTE LTD, SINGAPORE",2020-04-07 +international journal of biostatistics,2194-573X,1557-4679,NA,0,0,1,0,Mathematical & Computational Biology | Statistics & Probability,NA,NA,WALTER DE GRUYTER GMBH,NA +international journal of bipolar disorders,2194-7511,2194-7511,NA,0,0,1,0,Psychiatry,NA,NA,SPRINGER,NA +international journal of business communication,2329-4884,2329-4892,NA,0,1,0,0,NA,Business | Communication,NA,SAGE PUBLICATIONS INC,NA +international journal of cancer,0020-7136,1097-0215,IntJCanc,0,0,1,1,Oncology,NA,NA,WILEY,2015-03-17 +international journal of cardiology,0167-5273,1874-1754,IJCardio,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,ELSEVIER IRELAND LTD,2019-12-16 +international journal of cardiovascular imaging,1569-5794,1573-0743,IntJCVImaging,0,0,1,1,"Cardiac & Cardiovascular System | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,2019-09-12 +international journal of cast metals research,1364-0461,1743-1336,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of central banking,1815-4654,1815-7556,NA,0,1,0,0,NA,"Business, Finance",NA,ASSOC INTERNATIONAL JOURNAL CENTRAL BANKING,NA +international journal of chemical engineering,1687-806X,1687-8078,NA,0,0,1,0,"Engineering, Chemical",NA,NA,HINDAWI LTD,NA +international journal of chemical kinetics,0538-8066,1097-4601,NA,0,0,1,0,"Chemistry, Physical",NA,NA,WILEY,NA +international journal of chemical reactor engineering,2194-5748,1542-6580,NA,0,0,1,0,"Engineering, Chemical",NA,NA,WALTER DE GRUYTER GMBH,NA +international journal of childrens spirituality,1364-436X,1469-8455,NA,1,0,0,0,NA,NA,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of chronic obstructive pulmonary disease,1178-2005,1178-2005,NA,0,0,1,0,Respiratory System,NA,NA,DOVE MEDICAL PRESS LTD,NA +international journal of circuit theory and applications,0098-9886,1097-007X,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +international journal of circumpolar health,1239-9736,2242-3982,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,NA +international journal of circumpolar health,1239-9736,2242-3982,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,NA +international journal of civil engineering,1735-0522,2383-3874,NA,0,0,1,0,"Engineering, Civil",NA,NA,SPRINGER INT PUBL AG,NA +international journal of climate change strategies and management,1756-8692,1756-8706,NA,0,1,0,0,NA,Environmental Studies,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of climatology,0899-8418,1097-0088,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,WILEY,NA +international journal of clinical and experimental hypnosis,0020-7144,1744-5183,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of clinical and health psychology,1697-2600,1576-7329,NA,0,1,0,0,NA,"Psychology, Clinical",NA,ELSEVIER SCIENCE INC,NA +international journal of clinical oncology,1341-9625,1437-7772,NA,0,0,1,0,Oncology,NA,NA,SPRINGER JAPAN KK,NA +international journal of clinical pharmacology and therapeutics,0946-1965,0946-1965,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,DUSTRI-VERLAG DR KARL FEISTLE,NA +international journal of clinical pharmacy,2210-7703,2210-7711,IntJClinPharm,0,0,1,1,Pharmacology & Pharmacy,NA,NA,SPRINGER,2021-07-08 +international journal of clinical practice,1368-5031,1742-1241,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,WILEY,NA +international journal of clothing science and technology,0955-6222,1758-5953,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of coal geology,0166-5162,1872-7840,NA,0,0,1,0,"Energy & Fuels | Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +international journal of coal preparation and utilization,1939-2699,1939-2702,NA,0,0,1,0,Energy & Fuels | Mining & Mineral Processing,NA,NA,TAYLOR & FRANCIS INC,NA +international journal of cognitive therapy,1937-1209,1937-1217,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,SPRINGER INT PUBL AG,NA +international journal of colorectal disease,0179-1958,1432-1262,NA,0,0,1,0,Gastroenterology & Hepatology | Surgery,NA,NA,SPRINGER,NA +international journal of communication,1932-8036,1932-8036,NA,0,1,0,0,NA,Communication,NA,USC ANNENBERG PRESS,NA +international journal of communication systems,1074-5351,1099-1131,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,WILEY,NA +international journal of community music,1752-6299,1752-6302,NA,1,0,0,0,NA,NA,Music,INTELLECT LTD,NA +international journal of comparative sociology,0020-7152,1745-2554,NA,0,1,0,0,NA,Sociology,NA,SAGE PUBLICATIONS INC,NA +international journal of computational fluid dynamics,1061-8562,1029-0257,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of computational intelligence systems,1875-6891,1875-6883,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",NA,NA,SPRINGERNATURE,NA +international journal of computational methods,0219-8762,1793-6969,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of computer-supported collaborative learning,1556-1607,1556-1615,NA,0,1,0,0,NA,Education & Educational Research | Information Science & Library Science,NA,SPRINGER,NA +international journal of computer assisted radiology and surgery,1861-6410,1861-6429,NA,0,0,1,0,"Engineering, Biomedical | Radiology, Nuclear Medicine & Medical Imaging | Surgery",NA,NA,SPRINGER HEIDELBERG,NA +international journal of computer integrated manufacturing,0951-192X,1362-3052,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Manufacturing | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of computer mathematics,0020-7160,1029-0265,NA,0,0,1,0,"Mathematics, Applied",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of computer vision,0920-5691,1573-1405,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER,NA +international journal of computerized dentistry,1463-4201,1463-4201,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +international journal of computers communications & control,1841-9836,1841-9844,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Information Systems",NA,NA,CCC PUBL-AGORA UNIV,NA +international journal of concrete structures and materials,1976-0485,2234-1315,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +international journal of conflict and violence,1864-1385,1864-1385,NA,0,1,0,0,NA,International Relations | Political Science,NA,INST INTERDISCIPLINARY RES,NA +international journal of conflict management,1044-4068,1758-8545,NA,0,1,0,0,NA,Communication,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of consumer studies,1470-6423,1470-6431,NA,0,1,0,0,NA,Business,NA,WILEY,NA +international journal of contemporary hospitality management,0959-6119,1757-1049,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Management",NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of control,0020-7179,1366-5820,NA,0,0,1,0,Automation & Control Systems,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of control automation and systems,1598-6446,2005-4092,NA,0,0,1,0,Automation & Control Systems,NA,NA,"INST CONTROL ROBOTICS & SYSTEMS, KOREAN INST ELECTRICAL ENGINEERS",NA +international journal of cooperative information systems,0218-8430,1793-6365,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of corpus linguistics,1384-6655,1569-9811,IJCL_journal,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2015-03-26 +international journal of corpus linguistics,1384-6655,1569-9811,IJCL_journal,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2015-03-26 +international journal of cosmetic science,0142-5463,1468-2494,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +international journal of crashworthiness,1358-8265,1754-2111,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Mechanical",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of critical infrastructure protection,1874-5482,2212-2087,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Multidisciplinary",NA,NA,ELSEVIER,NA +international journal of cultural policy,1028-6632,1477-2833,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of cultural policy,1028-6632,1477-2833,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of cultural studies,1367-8779,1460-356X,IJCS_journal,1,1,0,1,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS INC,2018-09-10 +international journal of cultural studies,1367-8779,1460-356X,IJCS_journal,1,1,0,1,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS INC,2018-09-10 +international journal of dairy technology,1364-727X,1471-0307,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +international journal of damage mechanics,1056-7895,1530-7921,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics",NA,NA,SAGE PUBLICATIONS LTD,NA +international journal of data mining and bioinformatics,1748-5673,1748-5681,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of data warehousing and mining,1548-3924,1548-3932,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,IGI GLOBAL,NA +international journal of dental hygiene,1601-5029,1601-5037,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +international journal of dermatology,0011-9059,1365-4632,intjderm,0,0,1,1,Dermatology,NA,NA,WILEY,2014-02-12 +international journal of design,1991-3761,1994-036X,NA,1,1,1,0,"Engineering, Multidisciplinary | Engineering, Manufacturing","Social Sciences, Interdisciplinary",Art,"NATL TAIWAN UNIV SCI & TECHNOL",NA +international journal of design,1991-3761,1994-036X,NA,1,1,1,0,"Engineering, Multidisciplinary | Engineering, Manufacturing","Social Sciences, Interdisciplinary",Art,"NATL TAIWAN UNIV SCI & TECHNOL",NA +international journal of design,1991-3761,1994-036X,NA,1,1,1,0,"Engineering, Multidisciplinary | Engineering, Manufacturing","Social Sciences, Interdisciplinary",Art,"NATL TAIWAN UNIV SCI & TECHNOL",NA +international journal of developmental biology,0214-6282,1696-3547,NA,0,0,1,0,Developmental Biology,NA,NA,UNIV BASQUE COUNTRY UPV-EHU PRESS,NA +international journal of developmental disabilities,2047-3869,2047-3877,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,TAYLOR & FRANCIS LTD,NA +international journal of developmental neuroscience,0736-5748,1873-474X,NA,0,0,1,0,Developmental Biology | Neurosciences,NA,NA,WILEY,NA +international journal of diabetes in developing countries,0973-3930,1998-3832,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER INDIA,NA +international journal of digital earth,1753-8947,1753-8955,NA,0,0,1,0,"Geography, Physical | Remote Sensing",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of disability development and education,1034-912X,1465-346X,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of disaster risk reduction,2212-4209,2212-4209,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Water Resources",NA,NA,ELSEVIER,NA +international journal of disaster risk science,2095-0055,2192-6395,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Water Resources",NA,NA,SPRINGER,NA +international journal of distributed sensor networks,1550-1477,1550-1477,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,SAGE PUBLICATIONS INC,NA +international journal of drug policy,0955-3959,1873-4758,ijdrugpolicy,0,1,0,1,NA,Substance Abuse,NA,ELSEVIER,2013-01-03 +international journal of earth sciences,1437-3254,1437-3262,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +international journal of eating disorders,0276-3478,1098-108X,IntJEatDisord,0,1,1,1,Nutrition & Dietetics | Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,WILEY,2021-02-15 +international journal of eating disorders,0276-3478,1098-108X,IntJEatDisord,0,1,1,1,Nutrition & Dietetics | Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,WILEY,2021-02-15 +international journal of economic theory,1742-7355,1742-7363,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +international journal of educational development,0738-0593,1873-4871,NA,0,1,0,0,NA,Education & Educational Research,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of educational research,0883-0355,1873-538X,NA,0,1,0,0,NA,Education & Educational Research,NA,ELSEVIER SCI LTD,NA +international journal of educational technology in higher education,2365-9440,2365-9440,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +international journal of electrical power & energy systems,0142-0615,1879-3517,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,ELSEVIER SCI LTD,NA +international journal of electrochemical science,1452-3981,1452-3981,NA,0,0,1,0,Electrochemistry,NA,NA,ESG,NA +international journal of electronic commerce,1086-4415,1557-9301,NA,0,1,1,0,"Computer Science, Software Engineering",Business,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of electronic commerce,1086-4415,1557-9301,NA,0,1,1,0,"Computer Science, Software Engineering",Business,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of electronics,0020-7217,1362-3060,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of emerging markets,1746-8809,1746-8817,NA,0,1,0,0,NA,Business | Economics | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of endocrinology,1687-8337,1687-8345,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,HINDAWI LTD,NA +international journal of energy research,0363-907X,1099-114X,NA,0,0,1,0,Energy & Fuels | Nuclear Science & Technology,NA,NA,WILEY,NA +international journal of engine research,1468-0874,2041-3149,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical | Transportation Science & Technology",NA,NA,SAGE PUBLICATIONS LTD,NA +international journal of engineering education,0949-149X,0949-149X,NA,0,0,1,0,"Education, Scientific Disciplines | Engineering, Multidisciplinary",NA,NA,TEMPUS PUBLICATIONS,NA +international journal of engineering science,0020-7225,1879-2197,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of entrepreneurial behavior & research,1355-2554,1758-6534,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of environment and pollution,0957-4352,1741-5101,NA,0,0,1,0,Environmental Sciences,NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of environmental analytical chemistry,0306-7319,1029-0397,NA,0,0,1,0,"Chemistry, Analytical | Environmental Sciences",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of environmental health research,0960-3123,1369-1619,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of environmental research,1735-6865,2008-2304,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER INT PUBL AG,NA +international journal of environmental research and public health,1661-7827,1660-4601,IJERPH_MDPI,0,1,1,1,"Environmental Sciences | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,MDPI,2015-09-17 +international journal of environmental research and public health,1661-7827,1660-4601,IJERPH_MDPI,0,1,1,1,"Environmental Sciences | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,MDPI,2015-09-17 +international journal of environmental science and technology,1735-1472,1735-2630,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +international journal of epidemiology,0300-5771,1464-3685,IntJEpidemiol,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,OXFORD UNIV PRESS,2014-10-15 +international journal of evidence & proof,1365-7127,1740-5572,NA,0,1,0,0,NA,Law,NA,SAGE PUBLICATIONS LTD,NA +international journal of exergy,1742-8297,1742-8300,NA,0,0,1,0,Thermodynamics | Energy & Fuels,NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of experimental pathology,0959-9673,1365-2613,NA,0,0,1,0,Pathology,NA,NA,WILEY,NA +international journal of fatigue,0142-1123,1879-3452,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +international journal of feminist approaches to bioethics,1937-4585,1937-4577,IJFAB,0,1,0,1,NA,"Ethics | Social Sciences, Biomedical | Women'S Studies",NA,UNIV TORONTO PRESS INC,2013-04-29 +international journal of finance & economics,1076-9307,1099-1158,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +international journal of food engineering,2194-5764,1556-3758,NA,0,0,1,0,Food Science & Technology,NA,NA,WALTER DE GRUYTER GMBH,NA +international journal of food microbiology,0168-1605,1879-3460,NA,0,0,1,0,Food Science & Technology | Microbiology,NA,NA,ELSEVIER,NA +international journal of food properties,1094-2912,1532-2386,NA,0,0,1,0,Food Science & Technology,NA,NA,TAYLOR & FRANCIS INC,NA +international journal of food science and technology,0950-5423,1365-2621,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +international journal of food sciences and nutrition,0963-7486,1465-3478,NA,0,0,1,0,Food Science & Technology | Nutrition & Dietetics,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of forecasting,0169-2070,1872-8200,NA,0,1,0,0,NA,Economics | Management,NA,ELSEVIER,NA +international journal of forensic mental health,1499-9013,1932-9903,NA,0,1,0,0,NA,Criminology & Penology | Psychiatry,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of forest engineering,1494-2119,1913-2220,NA,0,0,1,0,Forestry,NA,NA,TAYLOR & FRANCIS INC,NA +international journal of foundations of computer science,0129-0541,1793-6373,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of fracture,0376-9429,1573-2673,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics",NA,NA,SPRINGER,NA +international journal of fruit science,1553-8362,1553-8621,NA,0,0,1,0,Horticulture,NA,NA,TAYLOR & FRANCIS INC,NA +international journal of fuzzy systems,1562-2479,2199-3211,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,SPRINGER HEIDELBERG,NA +international journal of game theory,0020-7276,1432-1270,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,SPRINGER HEIDELBERG,NA +international journal of game theory,0020-7276,1432-1270,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Economics | Social Sciences, Mathematical Methods",NA,SPRINGER HEIDELBERG,NA +international journal of gastronomy and food science,1878-450X,1878-4518,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER,NA +international journal of general medicine,1178-7074,1178-7074,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,DOVE MEDICAL PRESS LTD,NA +international journal of general systems,0308-1079,1563-5104,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of genomics,2314-436X,2314-4378,NA,0,0,1,0,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,HINDAWI LTD,NA +international journal of geographical information science,1365-8816,1362-3087,ijgis,0,1,1,1,"Computer Science, Information Systems | Geography, Physical",Geography | Information Science & Library Science,NA,TAYLOR & FRANCIS LTD,2020-07-06 +international journal of geographical information science,1365-8816,1362-3087,ijgis,0,1,1,1,"Computer Science, Information Systems | Geography, Physical",Geography | Information Science & Library Science,NA,TAYLOR & FRANCIS LTD,2020-07-06 +international journal of geomechanics,1532-3641,1943-5622,NA,0,0,1,0,"Engineering, Geological",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +international journal of geometric methods in modern physics,0219-8878,1793-6977,NA,0,0,1,0,"Physics, Mathematical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of geriatric psychiatry,0885-6230,1099-1166,NA,0,1,1,0,Geriatrics & Gerontology | Psychiatry,Psychiatry | Gerontology,NA,WILEY,NA +international journal of geriatric psychiatry,0885-6230,1099-1166,NA,0,1,1,0,Geriatrics & Gerontology | Psychiatry,Psychiatry | Gerontology,NA,WILEY,NA +international journal of gerontology,1873-9598,1873-958X,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,TAIWAN SOC GERIATRIC EMERGENCY & CRITICAL CARE MEDICINE-TSGECM,NA +international journal of global warming,1758-2083,1758-2091,NA,0,0,1,0,Environmental Sciences,NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of green energy,1543-5075,1543-5083,theIJGE,0,0,1,1,Thermodynamics | Green & Sustainable Science & Technology | Energy & Fuels,NA,NA,TAYLOR & FRANCIS INC,2021-01-05 +international journal of greenhouse gas control,1750-5836,1878-0148,NA,0,0,1,0,"Green & Sustainable Science & Technology | Energy & Fuels | Engineering, Environmental | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +international journal of group psychotherapy,0020-7284,1943-2836,AGPAJournal,0,1,0,1,NA,"Psychology, Clinical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-10-20 +international journal of gynecological cancer,1048-891X,1525-1438,NA,0,0,1,0,Oncology | Obstetrics & Gynecology,NA,NA,BMJ PUBLISHING GROUP,NA +international journal of gynecological pathology,0277-1691,1538-7151,IJGynP,0,0,1,1,Obstetrics & Gynecology | Pathology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2017-12-15 +international journal of gynecology & obstetrics,0020-7292,1879-3479,IJGOLive,0,0,1,1,Obstetrics & Gynecology,NA,NA,WILEY,2014-07-24 +international journal of health economics and management,2199-9023,2199-9031,NA,0,1,0,0,NA,"Business, Finance | Economics | Health Policy & Services",NA,SPRINGER,NA +international journal of health geographics,1476-072X,1476-072X,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,NA +international journal of health geographics,1476-072X,1476-072X,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,NA +international journal of health planning and management,0749-6753,1099-1751,NA,0,1,0,0,NA,"Health Policy & Services | Public, Environmental & Occupational Health",NA,WILEY,NA +international journal of health policy and management,NA,2322-5939,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,KERMAN UNIV MEDICAL SCIENCES,NA +international journal of health policy and management,NA,2322-5939,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,KERMAN UNIV MEDICAL SCIENCES,NA +international journal of health services,0020-7314,1541-4469,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,SAGE PUBLICATIONS LTD,NA +international journal of health services,0020-7314,1541-4469,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,SAGE PUBLICATIONS LTD,NA +international journal of heat and fluid flow,0142-727X,1879-2278,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical | Mechanics",NA,NA,ELSEVIER SCIENCE INC,NA +international journal of heat and mass transfer,0017-9310,1879-2189,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical | Mechanics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of heavy vehicle systems,1744-232X,1741-5152,NA,0,0,1,0,"Engineering, Mechanical | Transportation Science & Technology",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of hematology,0925-5710,1865-3774,NA,0,0,1,0,Hematology,NA,NA,SPRINGER JAPAN KK,NA +international journal of heritage studies,1352-7258,1470-3610,NA,1,1,0,0,NA,"Social Sciences, Interdisciplinary","Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of heritage studies,1352-7258,1470-3610,NA,1,1,0,0,NA,"Social Sciences, Interdisciplinary","Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of high performance computing applications,1094-3420,1741-2846,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Interdisciplinary Applications | Computer Science, Theory & Methods",NA,NA,SAGE PUBLICATIONS LTD,NA +international journal of hindu studies,1022-4556,1574-9282,NA,1,0,0,0,NA,NA,Religion,SPRINGER,NA +international journal of historical archaeology,1092-7697,1573-7748,NA,1,0,0,0,NA,NA,Archaeology,SPRINGER,NA +international journal of hospitality management,0278-4319,1873-4693,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,ELSEVIER SCI LTD,NA +international journal of housing policy,1949-1247,1949-1255,NA,0,1,0,0,NA,Environmental Studies | Regional & Urban Planning | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of human-computer interaction,1044-7318,1532-7590,NA,0,1,1,0,"Computer Science, Cybernetics",Ergonomics,NA,TAYLOR & FRANCIS INC,NA +international journal of human-computer interaction,1044-7318,1532-7590,NA,0,1,1,0,"Computer Science, Cybernetics",Ergonomics,NA,TAYLOR & FRANCIS INC,NA +international journal of human-computer studies,1071-5819,1095-9300,NA,0,1,1,0,"Computer Science, Cybernetics","Ergonomics | Psychology, Multidisciplinary",NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +international journal of human-computer studies,1071-5819,1095-9300,NA,0,1,1,0,"Computer Science, Cybernetics","Ergonomics | Psychology, Multidisciplinary",NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +international journal of human genetics,0972-3757,2456-6330,NA,0,0,1,0,Genetics & Heredity,NA,NA,KAMLA-RAJ ENTERPRISES,NA +international journal of human resource management,0958-5192,1466-4399,IJHRM_journal,0,1,0,1,NA,Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-02-09 +international journal of human rights,1364-2987,1744-053X,inrights,0,1,0,1,NA,Law,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-12-02 +international journal of humanities and arts computing-a journal of digital humanities,1753-8548,1755-1706,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",EDINBURGH UNIV PRESS,NA +international journal of humanoid robotics,0219-8436,1793-6942,NA,0,0,1,0,Robotics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of hydrogen energy,0360-3199,1879-3487,NA,0,0,1,0,"Chemistry, Physical | Electrochemistry | Energy & Fuels",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of hygiene and environmental health,1438-4639,1618-131X,NA,0,0,1,0,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,ELSEVIER GMBH,NA +international journal of hypertension,2090-0384,2090-0392,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,HINDAWI LTD,NA +international journal of hyperthermia,0265-6736,1464-5157,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of imaging systems and technology,0899-9457,1098-1098,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Imaging Science & Photographic Technology",NA,NA,WILEY,NA +international journal of immunogenetics,1744-3121,1744-313X,NA,0,0,1,0,Genetics & Heredity | Immunology,NA,NA,WILEY,NA +international journal of immunopathology and pharmacology,0394-6320,2058-7384,NA,0,0,1,0,Immunology | Pathology | Pharmacology & Pharmacy,NA,NA,SAGE PUBLICATIONS INC,NA +international journal of impact engineering,0734-743X,1879-3509,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of implant dentistry,2198-4034,2198-4034,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,SPRINGER JAPAN KK,NA +international journal of impotence research,0955-9930,1476-5489,yoursexmedjour,0,0,1,1,Urology & Nephrology,NA,NA,SPRINGERNATURE,2017-10-22 +international journal of inclusive education,1360-3116,1464-5173,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of industrial engineering-theory applications and practice,1943-670X,1943-670X,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing",NA,NA,UNIV CINCINNATI INDUSTRIAL ENGINEERING,NA +international journal of industrial engineering computations,1923-2926,1923-2934,NA,0,0,1,0,"Engineering, Industrial | Operations Research & Management Science",NA,NA,GROWING SCIENCE,NA +international journal of industrial ergonomics,0169-8141,1872-8219,NA,0,1,1,0,"Engineering, Industrial",Ergonomics,NA,ELSEVIER,NA +international journal of industrial ergonomics,0169-8141,1872-8219,NA,0,1,1,0,"Engineering, Industrial",Ergonomics,NA,ELSEVIER,NA +international journal of industrial organization,0167-7187,1873-7986,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +international journal of infectious diseases,1201-9712,1878-3511,NA,0,0,1,0,Infectious Diseases,NA,NA,ELSEVIER SCI LTD,NA +international journal of information management,0268-4012,1873-4707,NA,0,1,0,0,NA,Information Science & Library Science,NA,ELSEVIER SCI LTD,NA +international journal of information security,1615-5262,1615-5270,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +international journal of information technology & decision making,0219-6220,1793-6845,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Computer Science, Interdisciplinary Applications | Operations Research & Management Science",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of injury control and safety promotion,1745-7300,1745-7319,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,NA +international journal of intangible heritage,1975-3586,1975-4019,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","NATL FOLK MUSEUM KOREA-NFMK",NA +international journal of integrated care,1568-4156,1568-4156,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,UBIQUITY PRESS LTD,NA +international journal of integrated care,1568-4156,1568-4156,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,UBIQUITY PRESS LTD,NA +international journal of intelligent systems,0884-8173,1098-111X,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,WILEY,NA +international journal of interactive multimedia and artificial intelligence,1989-1660,1989-1660,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",NA,NA,UNIV INT RIOJA-UNIR,NA +international journal of intercultural relations,0147-1767,1873-7552,NA,0,1,0,0,NA,"Psychology, Social | Social Sciences, Interdisciplinary | Sociology",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of islamic and middle eastern finance and management,1753-8394,1753-8408,NA,0,1,0,0,NA,"Business, Finance | Management",NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of islamic architecture,2045-5895,2045-5909,IJIA_Journal,1,0,0,1,NA,NA,Architecture,INTELLECT LTD,2015-07-03 +international journal of laboratory hematology,1751-5521,1751-553X,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +international journal of language & communication disorders,1368-2822,1460-6984,ijlcd,0,1,1,1,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,WILEY,2015-05-06 +international journal of language & communication disorders,1368-2822,1460-6984,ijlcd,0,1,1,1,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,WILEY,2015-05-06 +international journal of law and psychiatry,0160-2527,1873-6386,NA,0,1,0,0,NA,Law | Psychiatry,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of law crime and justice,1756-0616,1876-763X,NA,0,1,0,0,NA,Criminology & Penology | Law,NA,ELSEVIER SCI LTD,NA +international journal of law in context,1744-5523,1744-5531,IJLC_CUP,0,1,0,1,NA,Law,NA,CAMBRIDGE UNIV PRESS,2019-09-15 +international journal of law policy and the family,1360-9939,1464-3707,NA,0,1,0,0,NA,Family Studies | Law,NA,OXFORD UNIV PRESS,NA +international journal of lean six sigma,2040-4166,2040-4174,NA,0,1,1,0,"Engineering, Industrial",Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of lean six sigma,2040-4166,2040-4174,NA,0,1,1,0,"Engineering, Industrial",Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of legal medicine,0937-9827,1437-1596,NA,0,0,1,0,"Medicine, Legal",NA,NA,SPRINGER,NA +international journal of lexicography,0950-3846,1477-4577,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,OXFORD UNIV PRESS,NA +international journal of lexicography,0950-3846,1477-4577,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,OXFORD UNIV PRESS,NA +international journal of life cycle assessment,0948-3349,1614-7502,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,SPRINGER HEIDELBERG,NA +international journal of logistics-research and applications,1367-5567,1469-848X,NA,0,1,0,0,NA,Management,NA,TAYLOR & FRANCIS LTD,NA +international journal of logistics management,0957-4093,1758-6550,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of low-carbon technologies,1748-1317,1748-1325,NA,0,0,1,0,Thermodynamics | Energy & Fuels,NA,NA,OXFORD UNIV PRESS,NA +international journal of lower extremity wounds,1534-7346,1552-6941,NA,0,0,1,0,Dermatology | Surgery,NA,NA,SAGE PUBLICATIONS INC,NA +international journal of machine learning and cybernetics,1868-8071,1868-808X,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER HEIDELBERG,NA +international journal of machine tools & manufacture,0890-6955,1879-2170,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Mechanical",NA,NA,ELSEVIER SCI LTD,NA +international journal of management education,1472-8117,2352-3565,NA,0,1,0,0,NA,Business | Education & Educational Research | Management,NA,ELSEVIER SCI LTD,NA +international journal of management reviews,1460-8545,1468-2370,IJMR_BAM,0,1,0,1,NA,Business | Management,NA,WILEY,2017-05-06 +international journal of managing projects in business,1753-8378,1753-8386,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of manpower,0143-7720,1758-6577,NA,0,1,0,0,NA,Industrial Relations & Labor | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of marine and coastal law,0927-3522,1571-8085,NA,0,1,0,0,NA,Law,NA,MARTINUS NIJHOFF PUBL,NA +international journal of maritime engineering,1479-8751,1740-0716,NA,0,0,1,0,"Engineering, Marine",NA,NA,ROYAL INST NAVAL ARCHITECTS,NA +international journal of market research,1470-7853,2515-2173,NA,0,1,0,0,NA,Business,NA,SAGE PUBLICATIONS LTD,NA +international journal of mass spectrometry,1387-3806,1873-2798,NA,0,0,1,0,"Physics, Atomic, Molecular & Chemical | Spectroscopy",NA,NA,ELSEVIER,NA +international journal of material forming,1960-6206,1960-6214,NA,0,0,1,0,"Engineering, Manufacturing | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,SPRINGER FRANCE,NA +international journal of materials & product technology,0268-1900,1741-5209,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of materials research,1862-5282,2195-8556,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,WALTER DE GRUYTER GMBH,NA +international journal of mathematics,0129-167X,1793-6519,NA,0,0,1,0,Mathematics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of mechanical sciences,0020-7403,1879-2162,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of mechanics and materials in design,1569-1713,1573-8841,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary | Mechanics",NA,NA,SPRINGER HEIDELBERG,NA +international journal of medical informatics,1386-5056,1872-8243,NA,0,0,1,0,"Computer Science, Information Systems | Health Care Sciences & Services | Medical Informatics",NA,NA,ELSEVIER IRELAND LTD,NA +international journal of medical microbiology,1438-4221,1618-0607,NA,0,0,1,0,Microbiology | Virology,NA,NA,ELSEVIER GMBH,NA +international journal of medical robotics and computer assisted surgery,1478-5951,1478-596X,NA,0,0,1,0,Surgery,NA,NA,WILEY,NA +international journal of medical sciences,1449-1907,1449-1907,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,IVYSPRING INT PUBL,NA +international journal of medicinal mushrooms,1521-9437,1940-4344,NA,0,0,1,0,Mycology | Pharmacology & Pharmacy,NA,NA,BEGELL HOUSE INC,NA +international journal of mental health and addiction,1557-1874,1557-1882,NA,0,1,1,0,Substance Abuse | Psychiatry,"Substance Abuse | Psychiatry | Psychology, Clinical",NA,SPRINGER,NA +international journal of mental health and addiction,1557-1874,1557-1882,NA,0,1,1,0,Substance Abuse | Psychiatry,"Substance Abuse | Psychiatry | Psychology, Clinical",NA,SPRINGER,NA +international journal of mental health nursing,1445-8330,1447-0349,IJMHN,0,1,1,1,Nursing | Psychiatry,Nursing | Psychiatry,NA,WILEY,2012-06-04 +international journal of mental health nursing,1445-8330,1447-0349,IJMHN,0,1,1,1,Nursing | Psychiatry,Nursing | Psychiatry,NA,WILEY,2012-06-04 +international journal of mental health promotion,1462-3730,2049-8543,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Psychiatry",NA,TECH SCIENCE PRESS,NA +international journal of mental health systems,1752-4458,1752-4458,NA,0,1,0,0,NA,Psychiatry,NA,BMC,NA +international journal of metalcasting,1939-5981,2163-3193,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER INT PUBL AG,NA +international journal of methods in psychiatric research,1049-8931,1557-0657,NA,0,1,1,0,Psychiatry,Psychiatry,NA,WILEY,NA +international journal of methods in psychiatric research,1049-8931,1557-0657,NA,0,1,1,0,Psychiatry,Psychiatry,NA,WILEY,NA +international journal of micro air vehicles,1756-8293,1756-8307,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,SAGE PUBLICATIONS LTD,NA +international journal of microwave and wireless technologies,1759-0787,1759-0795,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,CAMBRIDGE UNIV PRESS,NA +international journal of middle east studies,0020-7438,1471-6380,ijmes1,0,1,0,1,NA,Area Studies,NA,CAMBRIDGE UNIV PRESS,2012-04-19 +international journal of minerals metallurgy and materials,1674-4799,1869-103X,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering | Mining & Mineral Processing",NA,NA,SPRINGER,NA +international journal of mining reclamation and environment,1748-0930,1748-0949,NA,0,0,1,0,Environmental Sciences | Mining & Mineral Processing,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of mining science and technology,2095-2686,2212-6066,NA,0,0,1,0,Mining & Mineral Processing,NA,NA,ELSEVIER,NA +international journal of mobile communications,1470-949X,1741-5217,NA,0,1,0,0,NA,Communication,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of modern physics a,0217-751X,1793-656X,NA,0,0,1,0,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of modern physics b,0217-9792,1793-6578,NA,0,0,1,0,"Physics, Applied | Physics, Condensed Matter | Physics, Mathematical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of modern physics c,0129-1831,1793-6586,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Physics, Mathematical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of modern physics d,0218-2718,1793-6594,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of modern physics e,0218-3013,1793-6608,NA,0,0,1,0,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of molecular medicine,1107-3756,1791-244X,IJMMedicine,0,0,1,1,"Medicine, Research & Experimental",NA,NA,SPANDIDOS PUBL LTD,2018-05-15 +international journal of molecular sciences,1661-6596,1422-0067,IJMS_MDPI,0,0,1,1,"Biochemistry & Molecular Biology | Chemistry, Multidisciplinary",NA,NA,MDPI,2015-09-09 +international journal of morphology,0717-9502,0717-9367,intjmorphology,0,0,1,1,Anatomy & Morphology,NA,NA,SOC CHILENA ANATOMIA,2021-09-24 +international journal of multilingualism,1479-0718,1747-7530,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of multilingualism,1479-0718,1747-7530,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of multimedia information retrieval,2192-6611,2192-662X,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Software Engineering",NA,NA,SPRINGER,NA +international journal of multiphase flow,0301-9322,1879-3533,NA,0,0,1,0,Mechanics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of music education,0255-7614,1744-795X,NA,1,1,0,0,NA,Education & Educational Research,Music,SAGE PUBLICATIONS LTD,NA +international journal of music education,0255-7614,1744-795X,NA,1,1,0,0,NA,Education & Educational Research,Music,SAGE PUBLICATIONS LTD,NA +international journal of nanomedicine,1178-2013,1178-2013,NA,0,0,1,0,Nanoscience & Nanotechnology | Pharmacology & Pharmacy,NA,NA,DOVE MEDICAL PRESS LTD,NA +international journal of nanotechnology,1475-7435,1741-8151,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of nautical archaeology,1057-2414,1095-9270,ijna3,1,0,0,1,NA,NA,Archaeology,TAYLOR & FRANCIS LTD,2014-01-06 +international journal of naval architecture and ocean engineering,2092-6782,2092-6790,NA,0,0,1,0,"Engineering, Marine",NA,NA,SOC NAVAL ARCHITECTS KOREA,NA +international journal of network management,1055-7148,1099-1190,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,WILEY,NA +international journal of neural systems,0129-0657,1793-6462,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of neuropsychopharmacology,1461-1457,1469-5111,NA,0,0,1,0,Clinical Neurology | Neurosciences | Pharmacology & Pharmacy | Psychiatry,NA,NA,OXFORD UNIV PRESS,NA +international journal of neuroscience,0020-7454,1563-5279,NA,0,0,1,0,Neurosciences,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of non-linear mechanics,0020-7462,1878-5638,NA,0,0,1,0,Mechanics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of nonlinear sciences and numerical simulation,1565-1339,2191-0294,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Applied | Mechanics | Physics, Mathematical",NA,NA,WALTER DE GRUYTER GMBH,NA +international journal of number theory,1793-0421,1793-7310,NA,0,0,1,0,Mathematics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of numerical analysis and modeling,1705-5105,1705-5105,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ISCI-INST SCIENTIFIC COMPUTING & INFORMATION,NA +international journal of numerical methods for heat & fluid flow,0961-5539,1758-6585,NA,0,0,1,0,"Thermodynamics | Mathematics, Interdisciplinary Applications | Mechanics",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of numerical modelling-electronic networks devices and fields,0894-3370,1099-1204,NA,0,0,1,0,"Engineering, Electrical & Electronic | Mathematics, Interdisciplinary Applications",NA,NA,WILEY,NA +international journal of nursing knowledge,2047-3087,2047-3095,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +international journal of nursing knowledge,2047-3087,2047-3095,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +international journal of nursing practice,1322-7114,1440-172X,IntJNursPract,0,1,1,1,Nursing,Nursing,NA,WILEY,2021-08-27 +international journal of nursing practice,1322-7114,1440-172X,IntJNursPract,0,1,1,1,Nursing,Nursing,NA,WILEY,2021-08-27 +international journal of nursing studies,0020-7489,1873-491X,IJNSJournal,0,1,1,1,Nursing,Nursing,NA,PERGAMON-ELSEVIER SCIENCE LTD,2014-08-06 +international journal of nursing studies,0020-7489,1873-491X,IJNSJournal,0,1,1,1,Nursing,Nursing,NA,PERGAMON-ELSEVIER SCIENCE LTD,2014-08-06 +international journal of obesity,0307-0565,1476-5497,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,SPRINGERNATURE,NA +international journal of obstetric anesthesia,0959-289X,1532-3374,IJOA_Journal,0,0,1,1,Anesthesiology | Obstetrics & Gynecology,NA,NA,ELSEVIER SCI LTD,2018-03-09 +international journal of occupational medicine and environmental health,1232-1087,1896-494X,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,"NOFER INST OCCUPATIONAL MEDICINE, SW",NA +international journal of occupational safety and ergonomics,1080-3548,2376-9130,NA,0,1,0,0,NA,"Ergonomics | Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,NA +international journal of odonatology,1388-7890,2159-6719,NA,0,0,1,0,Entomology,NA,NA,WACHHOLTZ VERLAG GMBH,NA +international journal of offender therapy and comparative criminology,0306-624X,1552-6933,NA,0,1,0,0,NA,"Criminology & Penology | Psychology, Applied",NA,SAGE PUBLICATIONS INC,NA +international journal of offshore and polar engineering,1053-5381,NA,NA,0,0,1,0,"Engineering, Civil | Engineering, Ocean | Engineering, Mechanical",NA,NA,INT SOC OFFSHORE POLAR ENGINEERS,NA +international journal of oil gas and coal technology,1753-3309,1753-3317,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical | Engineering, Petroleum",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of older people nursing,1748-3735,1748-3743,NA,0,1,1,0,Geriatrics & Gerontology | Nursing,Nursing | Gerontology,NA,WILEY,NA +international journal of older people nursing,1748-3735,1748-3743,NA,0,1,1,0,Geriatrics & Gerontology | Nursing,Nursing | Gerontology,NA,WILEY,NA +international journal of oncology,1019-6439,1791-2423,IjOncology,0,0,1,1,Oncology,NA,NA,SPANDIDOS PUBL LTD,2018-05-14 +international journal of operations & production management,0144-3577,1758-6593,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of ophthalmology,2222-3959,2227-4898,NA,0,0,1,0,Ophthalmology,NA,NA,IJO PRESS,NA +international journal of optics,1687-9384,1687-9392,NA,0,0,1,0,Optics,NA,NA,HINDAWI LTD,NA +international journal of optomechatronics,1559-9612,1559-9620,NA,0,0,1,0,"Engineering, Electrical & Electronic | Engineering, Mechanical | Optics",NA,NA,TAYLOR & FRANCIS INC,NA +international journal of oral & maxillofacial implants,0882-2786,1942-4434,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +international journal of oral and maxillofacial surgery,0901-5027,1399-0020,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Surgery",NA,NA,CHURCHILL LIVINGSTONE,NA +international journal of oral implantology,2631-6420,2631-6439,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +international journal of oral science,1674-2818,2049-3169,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,SPRINGERNATURE,NA +international journal of osteoarchaeology,1047-482X,1099-1212,NA,1,1,0,0,NA,Anthropology,Archaeology,WILEY,NA +international journal of osteoarchaeology,1047-482X,1099-1212,NA,1,1,0,0,NA,Anthropology,Archaeology,WILEY,NA +international journal of osteopathic medicine,1746-0689,1878-0164,NA,0,0,1,0,"Medicine, General & Internal | Rehabilitation",NA,NA,ELSEVIER SCI LTD,NA +international journal of paediatric dentistry,0960-7439,1365-263X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Pediatrics",NA,NA,WILEY,NA +international journal of paleopathology,1879-9817,1879-9825,NA,0,0,1,0,Paleontology | Pathology,NA,NA,ELSEVIER SCIENCE INC,NA +international journal of parallel programming,0885-7458,1573-7640,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +international journal of pattern recognition and artificial intelligence,0218-0014,1793-6381,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of pavement engineering,1029-8436,1477-268X,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Characterization, Testing",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of pediatric otorhinolaryngology,0165-5876,1872-8464,NA,0,0,1,0,Otorhinolaryngology | Pediatrics,NA,NA,ELSEVIER IRELAND LTD,NA +international journal of peptide research and therapeutics,1573-3149,1573-3904,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,SPRINGER,NA +international journal of performance analysis in sport,2474-8668,1474-8185,NA,0,0,1,0,Sport Sciences,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of periodontics & restorative dentistry,0198-7569,1945-3388,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +international journal of pest management,0967-0874,1366-5863,NA,0,0,1,0,Entomology,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of pharmaceutics,0378-5173,1873-3476,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +international journal of pharmacology,1811-7775,1812-5700,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ASIAN NETWORK SCIENTIFIC INFORMATION-ANSINET,NA +international journal of philosophical studies,0967-2559,1466-4542,NA,1,0,0,0,NA,NA,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of photoenergy,1110-662X,1687-529X,NA,0,0,1,0,"Chemistry, Physical | Energy & Fuels | Optics | Physics, Atomic, Molecular & Chemical",NA,NA,HINDAWI LTD,NA +international journal of physical distribution & logistics management,0960-0035,1758-664X,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of physical modelling in geotechnics,1346-213X,2042-6550,NA,0,0,1,0,"Engineering, Geological",NA,NA,ICE PUBLISHING,NA +international journal of phytoremediation,1522-6514,1549-7879,NA,0,0,1,0,Environmental Sciences,NA,NA,TAYLOR & FRANCIS INC,NA +international journal of plant production,1735-6814,1735-8043,NA,0,0,1,0,Agronomy,NA,NA,SPRINGER,NA +international journal of plant sciences,1058-5893,1537-5315,IJPSJournal,0,0,1,1,Plant Sciences,NA,NA,UNIV CHICAGO PRESS,2012-08-17 +international journal of plasticity,0749-6419,1879-2154,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary | Mechanics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of polymer analysis and characterization,1023-666X,1563-5341,NA,0,0,1,0,Polymer Science,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of polymer science,1687-9422,1687-9430,NA,0,0,1,0,Polymer Science,NA,NA,HINDAWI LTD,NA +international journal of polymeric materials and polymeric biomaterials,0091-4037,1563-535X,NA,0,0,1,0,"Materials Science, Biomaterials | Polymer Science",NA,NA,TAYLOR & FRANCIS AS,NA +international journal of powder metallurgy,0888-7462,0888-7462,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,AMER POWDER METALLURGY INST,NA +international journal of precision engineering and manufacturing,2234-7593,2005-4602,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Mechanical",NA,NA,KOREAN SOC PRECISION ENG,NA +international journal of precision engineering and manufacturing-green technology,2288-6206,2198-0810,NA,0,0,1,0,"Green & Sustainable Science & Technology | Engineering, Manufacturing | Engineering, Mechanical",NA,NA,KOREAN SOC PRECISION ENG,NA +international journal of press-politics,1940-1612,1940-1620,NA,0,1,0,0,NA,Communication | Political Science,NA,SAGE PUBLICATIONS INC,NA +international journal of pressure vessels and piping,0308-0161,1879-3541,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Mechanical",NA,NA,ELSEVIER SCI LTD,NA +international journal of primatology,0164-0291,1573-8604,IntJPrimatology,0,0,1,1,Zoology,NA,NA,SPRINGER,2016-09-05 +international journal of production economics,0925-5273,1873-7579,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing | Operations Research & Management Science",NA,NA,ELSEVIER,NA +international journal of production research,0020-7543,1366-588X,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of project management,0263-7863,1873-4634,IJPMJrnl,0,1,0,1,NA,Management,NA,ELSEVIER SCI LTD,2020-07-03 +international journal of prosthodontics,0893-2174,1942-4426,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +international journal of psychiatry in clinical practice,1365-1501,1471-1788,NA,0,0,1,0,Psychiatry,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of psychiatry in medicine,0091-2174,1541-3527,NA,0,1,1,0,Psychiatry,Psychiatry,NA,SAGE PUBLICATIONS INC,NA +international journal of psychiatry in medicine,0091-2174,1541-3527,NA,0,1,1,0,Psychiatry,Psychiatry,NA,SAGE PUBLICATIONS INC,NA +international journal of psychoanalysis,0020-7578,1745-8315,The_IJP,0,1,0,1,NA,"Psychology, Psychoanalysis",NA,TAYLOR & FRANCIS LTD,2015-02-06 +international journal of psychological research,2011-7922,2011-2084,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"UNIV SAN BUENAVENTURA, MEDELLIN",NA +international journal of psychology,0020-7594,1464-066X,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,JOHN WILEY & SONS LTD,NA +international journal of psychophysiology,0167-8760,1872-7697,NA,0,1,1,0,Neurosciences | Physiology | Psychology,"Psychology, Biological | Psychology, Experimental",NA,ELSEVIER,NA +international journal of psychophysiology,0167-8760,1872-7697,NA,0,1,1,0,Neurosciences | Physiology | Psychology,"Psychology, Biological | Psychology, Experimental",NA,ELSEVIER,NA +international journal of public health,1661-8556,1661-8564,IJPH_official,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,FRONTIERS MEDIA SA,NA +international journal of public health,1661-8556,1661-8564,IJPH_official,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,FRONTIERS MEDIA SA,NA +international journal of public opinion research,0954-2892,1471-6909,ijpor_journal,0,1,0,1,NA,Communication | Political Science,NA,OXFORD UNIV PRESS,2021-10-27 +international journal of public theology,1872-5171,1569-7320,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +international journal of qualitative methods,1609-4069,1609-4069,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +international journal of qualitative studies on health and well-being,1748-2623,1748-2631,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Nursing | Social Sciences, Biomedical",NA,TAYLOR & FRANCIS LTD,NA +international journal of quantum chemistry,0020-7608,1097-461X,NA,0,0,1,0,"Chemistry, Physical | Mathematics, Interdisciplinary Applications | Quantum Science & Technology | Physics, Atomic, Molecular & Chemical",NA,NA,WILEY,NA +international journal of quantum information,0219-7499,1793-6918,NA,0,0,1,0,"Computer Science, Theory & Methods | Quantum Science & Technology | Physics, Particles & Fields | Physics, Mathematical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of radiation biology,0955-3002,1362-3095,IntJRadBiol,0,0,1,1,"Biology | Nuclear Science & Technology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,TAYLOR & FRANCIS LTD,2011-08-09 +international journal of radiation oncology biology physics,0360-3016,1879-355X,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,NA +international journal of radiation research,2322-3243,2322-3243,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,IJRR-IRANIAN JOURNAL RADIATION RES,NA +international journal of rail transportation,2324-8378,2324-8386,NA,0,0,1,0,Transportation Science & Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of refractory metals & hard materials,0263-4368,2213-3917,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,ELSEVIER SCI LTD,NA +international journal of refrigeration,0140-7007,1879-2081,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,ELSEVIER SCI LTD,NA +international journal of rehabilitation research,0342-5282,1473-5660,NA,0,1,1,0,Rehabilitation,Rehabilitation,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +international journal of rehabilitation research,0342-5282,1473-5660,NA,0,1,1,0,Rehabilitation,Rehabilitation,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +international journal of remote sensing,0143-1161,1366-5901,IJRemoteSensing,0,0,1,1,Remote Sensing | Imaging Science & Photographic Technology,NA,NA,TAYLOR & FRANCIS LTD,2021-01-14 +international journal of research in marketing,0167-8116,1873-8001,IJRMktg,0,1,0,1,NA,Business,NA,ELSEVIER,2019-08-01 +international journal of retail & distribution management,0959-0552,1758-6690,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of rf and microwave computer-aided engineering,1096-4290,1099-047X,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Electrical & Electronic",NA,NA,WILEY,NA +international journal of rheumatic diseases,1756-1841,1756-185X,NA,0,0,1,0,Rheumatology,NA,NA,WILEY,NA +international journal of robotics & automation,0826-8185,1925-7090,NA,0,0,1,0,Automation & Control Systems | Robotics,NA,NA,ACTA PRESS,NA +international journal of robotics research,0278-3649,1741-3176,NA,0,0,1,0,Robotics,NA,NA,SAGE PUBLICATIONS LTD,NA +international journal of robust and nonlinear control,1049-8923,1099-1239,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic | Mathematics, Applied",NA,NA,WILEY,NA +international journal of rock mechanics and mining sciences,1365-1609,1873-4545,NA,0,0,1,0,"Engineering, Geological | Mining & Mineral Processing",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of satellite communications and networking,1542-0973,1542-0981,NA,0,0,1,0,"Engineering, Aerospace | Telecommunications",NA,NA,WILEY,NA +international journal of science and mathematics education,1571-0068,1573-1774,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +international journal of science education,0950-0693,1464-5289,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of sediment research,1001-6279,1001-6279,NA,0,0,1,0,Environmental Sciences | Water Resources,NA,NA,IRTCES,NA +international journal of selection and assessment,0965-075X,1468-2389,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,WILEY,NA +international journal of sensor networks,1748-1279,1748-1287,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of sexual health,1931-7611,1931-762X,NA,0,1,0,0,NA,"Psychology, Clinical | Public, Environmental & Occupational Health | Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of shipping and transport logistics,1756-6517,1756-6525,NA,0,1,0,0,NA,Management | Transportation,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of simulation modelling,1726-4529,1996-8566,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing",NA,NA,DAAAM INTERNATIONAL VIENNA,NA +international journal of smart and nano materials,1947-5411,1947-542X,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of social psychiatry,0020-7640,1741-2854,NA,0,1,0,0,NA,Psychiatry,NA,SAGE PUBLICATIONS LTD,NA +international journal of social psychology,0213-4748,1579-3680,IJSP_RPS,0,1,0,1,NA,"Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-12-18 +international journal of social research methodology,1364-5579,1464-5300,IJSRM,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-12-19 +international journal of social robotics,1875-4791,1875-4805,NA,0,0,1,0,Robotics,NA,NA,SPRINGER,NA +international journal of social welfare,1369-6866,1468-2397,NA,0,1,0,0,NA,Social Work,NA,WILEY,NA +international journal of software engineering and knowledge engineering,0218-1940,1793-6403,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Software Engineering | Engineering, Electrical & Electronic",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of solids and structures,0020-7683,1879-2146,NA,0,0,1,0,Mechanics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +international journal of speech-language pathology,1754-9507,1754-9515,IJSLP,0,1,1,1,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,TAYLOR & FRANCIS LTD,2015-09-11 +international journal of speech-language pathology,1754-9507,1754-9515,IJSLP,0,1,1,1,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,TAYLOR & FRANCIS LTD,2015-09-11 +international journal of speech language and the law,1748-8885,1748-8893,NA,0,1,0,0,NA,Criminology & Penology | Linguistics,NA,EQUINOX PUBLISHING LTD,NA +international journal of speleology,0392-6672,1827-806X,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SOCIETA SPELEOLOGICA ITALIANA,NA +international journal of sport and exercise psychology,1612-197X,1557-251X,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international journal of sport finance,1558-6235,1930-076X,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,FITNESS INFORMATION TECHNOLOGY,NA +international journal of sport nutrition and exercise metabolism,1526-484X,1543-2742,IJSNEMJournal,0,0,1,1,Nutrition & Dietetics | Sport Sciences,NA,NA,HUMAN KINETICS PUBL INC,2016-09-07 +international journal of sport psychology,0047-0767,NA,intjsportpsy,0,1,1,1,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Multidisciplinary",NA,EDIZIONI LUIGI POZZI,2016-10-03 +international journal of sport psychology,0047-0767,NA,intjsportpsy,0,1,1,1,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Multidisciplinary",NA,EDIZIONI LUIGI POZZI,2016-10-03 +international journal of sports marketing & sponsorship,1464-6668,2515-7841,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of sports medicine,0172-4622,1439-3964,IntJSportsMed,0,0,1,1,Sport Sciences,NA,NA,GEORG THIEME VERLAG KG,2021-08-06 +international journal of sports physiology and performance,1555-0265,1555-0273,NA,0,0,1,0,Physiology | Sport Sciences,NA,NA,HUMAN KINETICS PUBL INC,NA +international journal of sports science & coaching,1747-9541,2048-397X,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,SAGE PUBLICATIONS LTD,NA +international journal of spray and combustion dynamics,1756-8277,1756-8285,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,SAGE PUBLICATIONS INC,NA +international journal of std & aids,0956-4624,1758-1052,NA,0,0,1,0,Immunology | Infectious Diseases,NA,NA,SAGE PUBLICATIONS LTD,NA +international journal of steel structures,1598-2351,2093-6311,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,KOREAN SOC STEEL CONSTRUCTION-KSSC,NA +international journal of stem cells,2005-3606,2005-5447,IntJStemCells,0,0,1,1,Cell & Tissue Engineering | Cell Biology,NA,NA,KOREAN SOC STEM CELL RESEARCH,2021-06-02 +international journal of stem education,2196-7822,2196-7822,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,SPRINGER,NA +international journal of stem education,2196-7822,2196-7822,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,SPRINGER,NA +international journal of strategic property management,1648-715X,1648-9179,NA,0,1,0,0,NA,Management,NA,VILNIUS GEDIMINAS TECH UNIV,NA +international journal of stress management,1072-5245,1573-3424,NA,0,1,0,0,NA,"Psychology, Applied",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +international journal of stroke,1747-4930,1747-4949,IntJStroke,0,0,1,1,Clinical Neurology | Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS LTD,2009-05-07 +international journal of structural stability and dynamics,0219-4554,1793-6764,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical | Mechanics",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of surface science and engineering,1749-785X,1749-7868,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary | Materials Science, Coatings & Films | Physics, Applied",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of surgery,1743-9191,1743-9159,IJSurgery,0,0,1,1,Surgery,NA,NA,ELSEVIER,2013-03-29 +international journal of surgical pathology,1066-8969,1940-2465,NA,0,0,1,0,Pathology | Surgery,NA,NA,SAGE PUBLICATIONS INC,NA +international journal of sustainability in higher education,1467-6370,1758-6739,NA,0,1,0,0,NA,Green & Sustainable Science & Technology | Education & Educational Research,NA,EMERALD GROUP PUBLISHING LTD,NA +international journal of sustainable development and world ecology,1350-4509,1745-2627,NA,0,0,1,0,Green & Sustainable Science & Technology | Ecology,NA,NA,TAYLOR & FRANCIS INC,NA +international journal of sustainable transportation,1556-8318,1556-8334,NA,0,1,0,0,NA,Green & Sustainable Science & Technology | Environmental Studies | Transportation,NA,TAYLOR & FRANCIS INC,NA +international journal of systematic and evolutionary microbiology,1466-5026,1466-5034,NA,0,0,1,0,Microbiology,NA,NA,MICROBIOLOGY SOC,NA +international journal of systematic theology,1463-1652,1468-2400,NA,1,0,0,0,NA,NA,Religion,WILEY,NA +international journal of systems science,0020-7721,1464-5319,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Theory & Methods | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of systems science-operations & logistics,2330-2674,2330-2682,NA,0,0,1,0,"Engineering, Industrial | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of technology and design education,0957-7572,1573-1804,NA,0,1,1,0,"Education, Scientific Disciplines | Engineering, Multidisciplinary",Education & Educational Research,NA,SPRINGER,NA +international journal of technology and design education,0957-7572,1573-1804,NA,0,1,1,0,"Education, Scientific Disciplines | Engineering, Multidisciplinary",Education & Educational Research,NA,SPRINGER,NA +international journal of technology assessment in health care,0266-4623,1471-6348,NA,0,0,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Medical Informatics",NA,NA,CAMBRIDGE UNIV PRESS,NA +international journal of technology management,0267-5730,1741-5276,NA,0,1,1,0,"Engineering, Multidisciplinary | Operations Research & Management Science",Management,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of technology management,0267-5730,1741-5276,NA,0,1,1,0,"Engineering, Multidisciplinary | Operations Research & Management Science",Management,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of the classical tradition,1073-0508,1874-6292,NA,1,0,0,0,NA,NA,"Classics | Humanities, Multidisciplinary",SPRINGER,NA +international journal of the commons,1875-0281,1875-0281,IJCCommons,0,1,0,1,NA,Environmental Studies,NA,"IGITUR, UTRECHT PUBLISHING & ARCHIVING SERVICES",2012-02-15 +international journal of the history of sport,0952-3367,1743-9035,ijhsofficial,1,1,0,1,NA,"History | Hospitality, Leisure, Sport & Tourism",History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-04-12 +international journal of the history of sport,0952-3367,1743-9035,ijhsofficial,1,1,0,1,NA,"History | Hospitality, Leisure, Sport & Tourism",History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-04-12 +international journal of the platonic tradition,1872-5082,1872-5473,NA,1,0,0,0,NA,NA,Philosophy,BRILL,NA +international journal of theoretical physics,0020-7748,1572-9575,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +international journal of thermal sciences,1290-0729,1778-4166,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +international journal of thermophysics,0195-928X,1572-9567,NA,0,0,1,0,"Thermodynamics | Chemistry, Physical | Mechanics | Physics, Applied",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +international journal of tourism research,1099-2340,1522-1970,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,WILEY,NA +international journal of toxicology,1091-5818,1092-874X,NA,0,0,1,0,Pharmacology & Pharmacy | Toxicology,NA,NA,SAGE PUBLICATIONS INC,NA +international journal of transgender health,2689-5269,2689-5277,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Psychology, Clinical | Social Sciences, Interdisciplinary | Social Sciences, Biomedical",NA,TAYLOR & FRANCIS INC,NA +international journal of transgender health,2689-5269,2689-5277,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Psychology, Clinical | Social Sciences, Interdisciplinary | Social Sciences, Biomedical",NA,TAYLOR & FRANCIS INC,NA +international journal of transitional justice,1752-7716,1752-7724,NA,0,1,0,0,NA,International Relations | Law | Political Science,NA,OXFORD UNIV PRESS,NA +international journal of transport economics,0391-8440,NA,NA,0,1,0,0,NA,Economics | Transportation,NA,FABRIZIO SERRA EDITORE,NA +international journal of tropical insect science,1742-7584,1742-7592,NA,0,0,1,0,Entomology,NA,NA,SPRINGER INT PUBL AG,NA +international journal of tuberculosis and lung disease,1027-3719,1815-7920,NA,0,0,1,0,Infectious Diseases | Respiratory System,NA,NA,INT UNION AGAINST TUBERCULOSIS LUNG DISEASE (I U A T L D),NA +international journal of turbo & jet-engines,0334-0082,2191-0332,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,WALTER DE GRUYTER GMBH,NA +international journal of uncertainty fuzziness and knowledge-based systems,0218-4885,1793-6411,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of unconventional computing,1548-7199,1548-7202,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,OLD CITY PUBLISHING INC,NA +international journal of urban and regional research,0309-1317,1468-2427,ijurresearch,0,1,0,1,NA,Geography | Regional & Urban Planning | Urban Studies,NA,WILEY,2011-08-14 +international journal of urban sciences,1226-5934,2161-6779,IJUS_journal,0,1,0,1,NA,Environmental Studies | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-07-30 +international journal of urology,0919-8172,1442-2042,NA,0,0,1,0,Urology & Nephrology,NA,NA,WILEY,NA +international journal of vehicle design,0143-3369,1741-5314,NA,0,0,1,0,"Engineering, Mechanical | Transportation Science & Technology",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of ventilation,1473-3315,2044-4044,NA,0,0,1,0,Construction & Building Technology | Energy & Fuels,NA,NA,TAYLOR & FRANCIS LTD,NA +international journal of water resources development,0790-0627,1360-0648,WRDwatermatters,0,0,1,1,Water Resources,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-07-03 +international journal of wavelets multiresolution and information processing,0219-6913,1793-690X,NA,0,0,1,0,"Computer Science, Software Engineering | Mathematics, Interdisciplinary Applications",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal of web and grid services,1741-1106,1741-1114,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +international journal of web services research,1545-7362,1546-5004,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,IGI GLOBAL,NA +international journal of wildland fire,1049-8001,1448-5516,IJWildlandFire,0,0,1,1,Forestry,NA,NA,CSIRO PUBLISHING,2020-11-09 +international journal of womens health,1179-1411,1179-1411,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,DOVE MEDICAL PRESS LTD,NA +international journal on artificial intelligence tools,0218-2130,1793-6349,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +international journal on document analysis and recognition,1433-2833,1433-2825,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER HEIDELBERG,NA +international journal on semantic web and information systems,1552-6283,1552-6291,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,IGI GLOBAL,NA +international journal on software tools for technology transfer,1433-2779,1433-2787,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,SPRINGER HEIDELBERG,NA +international labor and working-class history,0147-5479,1471-6445,ilwchjournal,1,1,0,1,NA,History | Industrial Relations & Labor,History,CAMBRIDGE UNIV PRESS,2020-08-27 +international labor and working-class history,0147-5479,1471-6445,ilwchjournal,1,1,0,1,NA,History | Industrial Relations & Labor,History,CAMBRIDGE UNIV PRESS,2020-08-27 +international labour review,0020-7780,1564-913X,NA,0,1,0,0,NA,Economics | Industrial Relations & Labor,NA,WILEY,NA +international marketing review,0265-1335,1758-6763,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +international materials reviews,0950-6608,1743-2804,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +international mathematics research notices,1073-7928,1687-0247,NA,0,0,1,0,Mathematics,NA,NA,OXFORD UNIV PRESS,NA +international microbiology,1139-6709,1618-1905,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,SPRINGER,NA +international migration,0020-7985,1468-2435,IntMig_Journal,0,1,0,1,NA,Demography,NA,WILEY,2020-12-15 +international migration review,0197-9183,1747-7379,IMRjournal,0,1,0,1,NA,Demography,NA,SAGE PUBLICATIONS INC,2015-04-16 +international multilingual research journal,1931-3152,1931-3160,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international multilingual research journal,1931-3152,1931-3160,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international neurourology journal,2093-4777,2093-6931,NA,0,0,1,0,Urology & Nephrology,NA,NA,KOREAN CONTINENCE SOC,NA +international nursing review,0020-8132,1466-7657,INR_Journal,0,1,1,1,Nursing,Nursing,NA,WILEY,2021-09-16 +international nursing review,0020-8132,1466-7657,INR_Journal,0,1,1,1,Nursing,Nursing,NA,WILEY,2021-09-16 +international ophthalmology,0165-5701,1573-2630,NA,0,0,1,0,Ophthalmology,NA,NA,SPRINGER,NA +international organization,0020-8183,1531-5088,intorgjournal,0,1,0,1,NA,International Relations | Political Science,NA,CAMBRIDGE UNIV PRESS,2013-05-24 +international orthopaedics,0341-2695,1432-5195,NA,0,0,1,0,Orthopedics,NA,NA,SPRINGER,NA +international peacekeeping,1353-3312,1743-906X,intpeacekeeping,0,1,0,1,NA,International Relations,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-02-04 +international perspectives on sexual and reproductive health,1944-0391,1944-0405,NA,0,1,0,0,NA,"Demography | Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,ALAN GUTTMACHER INST,NA +international philosophical quarterly,0019-0365,2153-8077,NA,1,0,0,0,NA,NA,Philosophy,PHILOSOPHY DOCUMENTATION CENTER,NA +international political science review,0192-5121,1460-373X,ipsr_journal,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS LTD,2013-08-20 +international political sociology,1749-5679,1749-5687,intpolitsocio,0,1,0,1,NA,International Relations | Political Science | Sociology,NA,OXFORD UNIV PRESS,2017-01-30 +international politics,1384-5748,1740-3898,ip_palgrave,0,1,0,1,NA,International Relations | Political Science,NA,PALGRAVE MACMILLAN LTD,2019-04-15 +international polymer processing,0930-777X,2195-8602,NA,0,0,1,0,"Engineering, Chemical | Polymer Science",NA,NA,WALTER DE GRUYTER GMBH,NA +international psychogeriatrics,1041-6102,1741-203X,IPG_Journal,0,1,1,1,Geriatrics & Gerontology | Psychiatry | Psychology,"Psychology, Clinical | Gerontology",NA,CAMBRIDGE UNIV PRESS,2015-02-02 +international psychogeriatrics,1041-6102,1741-203X,IPG_Journal,0,1,1,1,Geriatrics & Gerontology | Psychiatry | Psychology,"Psychology, Clinical | Gerontology",NA,CAMBRIDGE UNIV PRESS,2015-02-02 +international public management journal,1096-7494,1559-3169,IPMJournal,0,1,0,1,NA,Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-06-18 +international regional science review,0160-0176,1552-6925,NA,0,1,0,0,NA,Environmental Studies | Regional & Urban Planning | Urban Studies,NA,SAGE PUBLICATIONS INC,NA +international relations,0047-1178,1741-2862,intrelationsj,0,1,0,1,NA,International Relations,NA,SAGE PUBLICATIONS LTD,2014-11-11 +international relations of the asia-pacific,1470-482X,1470-4838,NA,0,1,0,0,NA,International Relations,NA,OXFORD UNIV PRESS,NA +international research in childrens literature,1755-6198,1755-6201,IRSCL_News,1,0,0,1,NA,NA,Literature,EDINBURGH UNIV PRESS,2018-02-06 +international review for the sociology of sport,1012-6902,1461-7218,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,SAGE PUBLICATIONS LTD,NA +international review of administrative sciences,0020-8523,1461-7226,NA,0,1,0,0,NA,Public Administration,NA,SAGE PUBLICATIONS LTD,NA +international review of african american art,1045-0920,NA,NA,1,0,0,0,NA,NA,Art,MUSEUM AFR AMER ART,NA +international review of cell and molecular biology,1937-6448,NA,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +international review of economics & finance,1059-0560,1873-8036,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +international review of economics education,1477-3880,2352-4421,NA,0,1,0,0,NA,Economics | Education & Educational Research,NA,ELSEVIER SCI LTD,NA +international review of finance,1369-412X,1468-2443,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +international review of financial analysis,1057-5219,1873-8079,NA,0,1,0,0,NA,"Business, Finance",NA,ELSEVIER SCIENCE INC,NA +international review of hydrobiology,1434-2944,1522-2632,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,WILEY,NA +international review of law and economics,0144-8188,1873-6394,NA,0,1,0,0,NA,Economics | Law,NA,ELSEVIER SCIENCE INC,NA +international review of neurobiology,0074-7742,2162-5514,NA,0,0,1,0,Neurosciences,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +international review of psychiatry,0954-0261,1369-1627,IntRevPsych,0,1,0,1,NA,Psychiatry,NA,TAYLOR & FRANCIS LTD,2013-12-20 +international review of research in developmental disabilities,2211-6095,2211-6109,NA,0,1,0,0,NA,"Education, Special | Psychology, Multidisciplinary",NA,ELSEVIER ACADEMIC PRESS INC,NA +international review of research in open and distributed learning,1492-3831,1492-3831,NA,0,1,0,0,NA,Education & Educational Research,NA,ATHABASCA UNIV PRESS,NA +international review of social history,0020-8590,1469-512X,irsh_iisg,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2017-07-27 +international review of social history,0020-8590,1469-512X,irsh_iisg,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2017-07-27 +international review of social psychology,2397-8570,2397-8570,irsp_rips,0,1,0,1,NA,"Psychology, Social",NA,UBIQUITY PRESS LTD,2015-09-27 +international review of sport and exercise psychology,1750-984X,1750-9858,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international review of the aesthetics and sociology of music,0351-5796,NA,NA,1,0,0,0,NA,NA,Music,CROATIAN MUSICOLOGICAL SOC,NA +international review of the red cross,1816-3831,1607-5889,NA,0,1,0,0,NA,Law,NA,CAMBRIDGE UNIV PRESS,NA +international reviews in physical chemistry,0144-235X,1366-591X,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,TAYLOR & FRANCIS LTD,NA +international reviews of immunology,0883-0185,1563-5244,NA,0,0,1,0,Immunology,NA,NA,TAYLOR & FRANCIS INC,NA +international security,0162-2889,1531-4804,journal_is,0,1,0,1,NA,International Relations,NA,MIT PRESS,2013-07-16 +international small business journal-researching entrepreneurship,0266-2426,1741-2870,I_S_B_J,0,1,0,1,NA,Business | Management,NA,SAGE PUBLICATIONS LTD,2013-10-15 +international social work,0020-8728,1461-7234,intsocialwork,0,1,0,1,NA,Social Work,NA,SAGE PUBLICATIONS LTD,2011-01-06 +international sociology,0268-5809,1461-7242,is_sociology,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2015-06-30 +international soil and water conservation research,2095-6339,2589-059X,NA,0,0,1,0,Environmental Sciences | Soil Science | Water Resources,NA,NA,KEAI PUBLISHING LTD,NA +international statistical review,0306-7734,1751-5823,NA,0,0,1,0,Statistics & Probability,NA,NA,WILEY,NA +international studies in the philosophy of science,0269-8595,1469-9281,NA,1,0,0,0,NA,NA,History & Philosophy Of Science,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +international studies perspectives,1528-3577,1528-3585,isp_journal,0,1,0,1,NA,International Relations,NA,OXFORD UNIV PRESS,2019-12-03 +international studies quarterly,0020-8833,1468-2478,isq_jrnl,0,1,0,1,NA,International Relations | Political Science,NA,OXFORD UNIV PRESS,2013-12-04 +international studies review,1521-9488,1468-2486,intlstudiesrev,0,1,0,1,NA,International Relations | Political Science,NA,OXFORD UNIV PRESS,2014-01-01 +international sugar journal,0020-8841,0020-8841,NA,0,0,1,0,Agronomy | Food Science & Technology,NA,NA,INT SUGAR JOURNAL LTD,NA +international surgery,0020-8868,2520-2456,Intlsurgery,0,0,1,1,Surgery,NA,NA,INT COLLEGE OF SURGEONS,2018-02-22 +international tax and public finance,0927-5940,1573-6970,ITAXjournal,0,1,0,1,NA,Economics,NA,SPRINGER,2020-08-21 +international theory,1752-9719,1752-9727,internatltheory,0,1,0,1,NA,International Relations | Political Science,NA,CAMBRIDGE UNIV PRESS,2010-03-04 +international transactions in operational research,0969-6016,1475-3995,ifors_itor,0,1,1,1,Operations Research & Management Science,Management,NA,WILEY,2020-06-08 +international transactions in operational research,0969-6016,1475-3995,ifors_itor,0,1,1,1,Operations Research & Management Science,Management,NA,WILEY,2020-06-08 +international transactions on electrical energy systems,2050-7038,2050-7038,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,WILEY,NA +international urogynecology journal,0937-3462,1433-3023,IUJ_BlueJournal,0,0,1,1,Obstetrics & Gynecology | Urology & Nephrology,NA,NA,SPRINGER LONDON LTD,2017-01-09 +international urology and nephrology,0301-1623,1573-2584,NA,0,0,1,0,Urology & Nephrology,NA,NA,SPRINGER,NA +international wound journal,1742-4801,1742-481X,IntWoundJournal,0,0,1,1,Dermatology | Surgery,NA,NA,WILEY,2020-02-08 +internationales archiv fur sozialgeschichte der deutschen literatur,0340-4528,1612-0442,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",WALTER DE GRUYTER GMBH,NA +internet and higher education,1096-7516,1873-5525,NA,0,1,0,0,NA,Education & Educational Research,NA,ELSEVIER SCIENCE INC,NA +internet interventions-the application of information technology in mental and behavioural health,2214-7829,2214-7829,iInterventions,0,1,1,1,Health Care Sciences & Services | Medical Informatics | Psychiatry,"Psychology, Clinical",NA,ELSEVIER,2018-07-20 +internet interventions-the application of information technology in mental and behavioural health,2214-7829,2214-7829,iInterventions,0,1,1,1,Health Care Sciences & Services | Medical Informatics | Psychiatry,"Psychology, Clinical",NA,ELSEVIER,2018-07-20 +internet of things,2543-1536,2542-6605,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications | Computer Science, Information Systems",NA,NA,ELSEVIER,NA +internet research,1066-2243,1066-2243,NA,0,1,1,0,"Computer Science, Information Systems | Telecommunications",Business,NA,EMERALD GROUP PUBLISHING LTD,NA +internet research,1066-2243,1066-2243,NA,0,1,1,0,"Computer Science, Information Systems | Telecommunications",Business,NA,EMERALD GROUP PUBLISHING LTD,NA +internist,0020-9554,1432-1289,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SPRINGER HEIDELBERG,NA +interpretation-a journal of bible and theology,0020-9643,2159-340X,Interp_Journal,1,0,0,1,NA,NA,Religion,SAGE PUBLICATIONS INC,2015-12-17 +interpretation-a journal of political philosophy,0020-9635,0020-9635,NA,1,0,0,0,NA,NA,Philosophy,"INTERPRETATION, INC",NA +interpretation-a journal of subsurface characterization,2324-8858,2324-8866,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SOC EXPLORATION GEOPHYSICISTS,NA +interpreter and translator trainer,1750-399X,1757-0417,ITT_journal,1,1,0,1,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-11-11 +interpreter and translator trainer,1750-399X,1757-0417,ITT_journal,1,1,0,1,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-11-11 +interpreting,1384-6647,1569-982X,InterpretingJ,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2021-02-13 +interpreting,1384-6647,1569-982X,InterpretingJ,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2021-02-13 +intersecciones en antropologia,1850-373X,1850-373X,NA,1,1,0,0,NA,Anthropology,Archaeology,UNIV NAC CENTRO PROVINCIA BUENOS AIRES,NA +intersecciones en antropologia,1850-373X,1850-373X,NA,1,1,0,0,NA,Anthropology,Archaeology,UNIV NAC CENTRO PROVINCIA BUENOS AIRES,NA +intervention in school and clinic,1053-4512,1538-4810,NA,0,1,0,0,NA,"Education, Special",NA,SAGE PUBLICATIONS INC,NA +interventional neuroradiology,1591-0199,2385-2011,INR_WFITN,0,0,1,1,"Clinical Neurology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SAGE PUBLICATIONS INC,2021-10-05 +interventions-international journal of postcolonial studies,1369-801X,1469-929X,InterventionsP9,1,1,0,1,NA,Cultural Studies | History,History | Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +interventions-international journal of postcolonial studies,1369-801X,1469-929X,InterventionsP9,1,1,0,1,NA,Cultural Studies | History,History | Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +intervirology,0300-5526,1423-0100,NA,0,0,1,0,Virology,NA,NA,KARGER,NA +invasive plant science and management,1939-7291,1939-747X,NA,0,0,1,0,Plant Sciences,NA,NA,CAMBRIDGE UNIV PRESS,NA +inventiones mathematicae,0020-9910,1432-1297,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +inverse problems,0266-5611,1361-6420,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,IOP PUBLISHING LTD,NA +inverse problems and imaging,1930-8337,1930-8345,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +inverse problems in science and engineering,1741-5977,1741-5985,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,TAYLOR & FRANCIS LTD,NA +invertebrate biology,1077-8306,1744-7410,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,WILEY,NA +invertebrate reproduction & development,0792-4259,2157-0272,NA,0,0,1,0,Reproductive Biology | Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +invertebrate systematics,1445-5226,1447-2600,NA,0,0,1,0,Evolutionary Biology | Zoology,NA,NA,CSIRO PUBLISHING,NA +investigacion bibliotecologica,0187-358X,2448-8321,NA,0,1,0,0,NA,Information Science & Library Science,NA,UNIV NACIONAL AUTONOMA MEXICO,NA +investigacion clinica,0535-5133,0535-5133,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,INST INVESTIGACION CLINICA,NA +investigacion economica,0185-1667,NA,InveconFEUNAM,0,1,0,1,NA,Economics,NA,"UNIV NACIONAL AUTONOMA MEXICO, FAC ECONOMIA",2019-11-05 +investigational new drugs,0167-6997,1573-0646,NA,0,0,1,0,Oncology | Pharmacology & Pharmacy,NA,NA,SPRINGER,NA +investigative and clinical urology,2466-0493,2466-054X,NA,0,0,1,0,Urology & Nephrology,NA,NA,KOREAN UROLOGICAL ASSOC,NA +investigative ophthalmology & visual science,0146-0404,1552-5783,ARVOiovs,0,0,1,1,Ophthalmology,NA,NA,ASSOC RESEARCH VISION OPHTHALMOLOGY INC,2013-08-05 +investigative radiology,0020-9996,1536-0210,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +investment analysts journal,1029-3523,2077-0227,NA,0,1,0,0,NA,"Business, Finance",NA,INVESTMENT ANALYSTS SOC SOUTHERN AFRICA,NA +inzinerine ekonomika-engineering economics,1392-2785,2029-5839,NA,0,1,0,0,NA,Economics,NA,KAUNAS UNIV TECHNOL,NA +ionics,0947-7047,1862-0760,NA,0,0,1,0,"Chemistry, Physical | Electrochemistry | Physics, Condensed Matter",NA,NA,SPRINGER HEIDELBERG,NA +iowa law review,0021-0552,NA,iowalawreview,0,1,0,1,NA,Law,NA,"UNIV IOWA, COLL LAW",2010-02-11 +iral-international review of applied linguistics in language teaching,0019-042X,1613-4141,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,WALTER DE GRUYTER GMBH,NA +iran-journal of the british institute of persian studies,0578-6967,2396-9202,NA,1,0,0,0,NA,NA,Archaeology | Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +iran and the caucasus,1609-8498,1573-384X,NA,1,0,0,0,NA,NA,History,BRILL,NA +iranian journal of allergy asthma and immunology,1735-1502,1735-5249,NA,0,0,1,0,Allergy | Immunology,NA,NA,TEHRAN UNIV MEDICAL SCIENCES,NA +iranian journal of basic medical sciences,2008-3866,2008-3874,NA,0,0,1,0,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,MASHHAD UNIV MED SCIENCES,NA +iranian journal of biotechnology,1728-3043,1728-3043,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,"NATL INST GENETIC ENGINEERING & BIOTECHNOLOGY",NA +iranian journal of chemistry & chemical engineering-international english edition,1021-9986,1021-9986,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,JIHAD DANESHGAHI,NA +iranian journal of fisheries sciences,1562-2916,1562-2916,NA,0,0,1,0,Fisheries,NA,NA,IRANIAN FISHERIES SCIENCE RESEARCH INST-IFSRI,NA +iranian journal of fuzzy systems,1735-0654,NA,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,UNIV SISTAN & BALUCHESTAN,NA +iranian journal of immunology,1735-1383,1735-367X,NA,0,0,1,0,Immunology,NA,NA,SHIRAZ INST CANCER RES,NA +iranian journal of kidney diseases,1735-8582,1735-8604,NA,0,0,1,0,Urology & Nephrology,NA,NA,IRANIAN SOC NEPHROLGY,NA +iranian journal of parasitology,1735-7020,2008-238X,NA,0,0,1,0,Parasitology,NA,NA,IRANIAN SCIENTIFIC SOCIETY MEDICAL ENTOMOLOGY,NA +iranian journal of pediatrics,2008-2142,2008-2150,IPediatr,0,0,1,1,Pediatrics,NA,NA,KOWSAR CORP,2020-09-18 +iranian journal of pharmaceutical research,1735-0328,1726-6890,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,"SHAHEED BEHESHTI UNIV, SCH PHARMACY",NA +iranian journal of public health,2251-6085,2251-6093,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,IRANIAN SCIENTIFIC SOCIETY MEDICAL ENTOMOLOGY,NA +iranian journal of public health,2251-6085,2251-6093,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,IRANIAN SCIENTIFIC SOCIETY MEDICAL ENTOMOLOGY,NA +iranian journal of radiology,1735-1065,2008-2711,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,KOWSAR PUBL,NA +iranian journal of science and technology-transactions of civil engineering,2228-6160,2364-1843,NA,0,0,1,0,"Engineering, Civil",NA,NA,SPRINGER INT PUBL AG,NA +iranian journal of science and technology-transactions of electrical engineering,2228-6179,2364-1827,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,SPRINGER INT PUBL AG,NA +iranian journal of science and technology-transactions of mechanical engineering,2228-6187,2364-1835,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,SPRINGER,NA +iranian journal of science and technology transaction a-science,1028-6276,2364-1819,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,SPRINGER INT PUBL AG,NA +iranian journal of veterinary research,1728-1997,2252-0589,NA,0,0,1,0,Veterinary Sciences,NA,NA,SHIRAZ UNIV,NA +iranian polymer journal,1026-1265,1735-5265,NA,0,0,1,0,Polymer Science,NA,NA,SPRINGER,NA +iranian red crescent medical journal,2074-1804,2074-1812,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ZAMENSALAMATI PUBL CO,NA +iranian studies,0021-0862,1475-4819,NA,1,1,0,0,NA,Area Studies,Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +iranian studies,0021-0862,1475-4819,NA,1,1,0,0,NA,Area Studies,Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +iranica antiqua,0021-0870,1783-1482,NA,1,0,0,0,NA,NA,Archaeology,PEETERS,NA +irbm,1959-0318,1876-0988,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,ELSEVIER SCIENCE INC,NA +irish educational studies,0332-3315,1747-4965,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +irish historical studies,0021-1214,2056-4139,IHS_1938,1,0,0,1,NA,NA,History,CAMBRIDGE UNIV PRESS,2018-11-24 +irish journal of agricultural and food research,0791-6833,2009-9029,IJAFR_Teagasc,0,0,1,1,"Agriculture, Multidisciplinary | Food Science & Technology",NA,NA,TEAGASC,2016-10-26 +irish journal of medical science,0021-1265,1863-4362,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SPRINGER LONDON LTD,NA +irish political studies,0790-7184,1743-9078,irishpolstudies,0,1,0,1,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-05-10 +irish studies review,0967-0882,1469-9303,IrishStudiesRev,1,0,0,1,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2011-09-02 +irish theological quarterly,0021-1400,1752-4989,NA,1,0,0,0,NA,NA,Religion,SAGE PUBLICATIONS LTD,NA +irish university review,0021-1427,2047-2153,IrishUniReview,1,0,0,1,NA,NA,Literary Reviews,EDINBURGH UNIV PRESS,2017-05-19 +irish veterinary journal,0368-0762,2046-0481,NA,0,0,1,0,Veterinary Sciences,NA,NA,BMC,NA +ironmaking & steelmaking,0301-9233,1743-2812,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,TAYLOR & FRANCIS LTD,NA +irrigation and drainage,1531-0353,1531-0361,NA,0,0,1,0,Agronomy | Water Resources,NA,NA,WILEY,NA +irrigation science,0342-7188,1432-1319,NA,0,0,1,0,Agronomy | Water Resources,NA,NA,SPRINGER,NA +isa transactions,0019-0578,1879-2022,NA,0,0,1,0,"Automation & Control Systems | Engineering, Multidisciplinary | Instruments & Instrumentation",NA,NA,ELSEVIER SCIENCE INC,NA +iscience,2589-0042,2589-0042,iScience_CP,0,0,1,1,Multidisciplinary Sciences,NA,NA,CELL PRESS,2017-09-28 +isegoria,1130-2097,1988-8376,NA,1,0,0,0,NA,NA,Philosophy,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +isi bilimi ve teknigi dergisi-journal of thermal science and technology,1300-3615,1300-3615,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,TURKISH SOC THERMAL SCIENCES TECHNOLOGY,NA +isij international,0915-1559,1347-5460,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,IRON STEEL INST JAPAN KEIDANREN KAIKAN,NA +isis,0021-1753,1545-6994,IsisJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2016-11-14 +isis,0021-1753,1545-6994,IsisJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2016-11-14 +isis,0021-1753,1545-6994,IsisJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2016-11-14 +isj-invertebrate survival journal,1824-307X,1824-307X,NA,0,0,1,0,Immunology | Zoology,NA,NA,INVERTEBRATE SURVIVAL JOURNAL,NA +islam-zeitschrift fur geschichte und kultur des islamischen orients,0021-1818,1613-0928,NA,1,0,0,0,NA,NA,Religion | Asian Studies,WALTER DE GRUYTER GMBH,NA +islam and christian-muslim relations,0959-6410,1469-9311,NA,1,0,0,0,NA,NA,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +islamic africa,2154-0993,2154-0993,NA,1,0,0,0,NA,NA,Religion,NORTHWESTERN UNIV PRESS,NA +islamic law and society,0928-9380,1568-5195,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +island arc,1038-4871,1440-1738,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,WILEY,NA +island studies journal,1715-2593,1715-2593,NA,0,1,0,0,NA,"Geography | Social Sciences, Interdisciplinary",NA,"UNIV PRINCE EDWARD ISLAND, INST ISLAND STUDIES",NA +isle-interdisciplinary studies in literature and environment,1076-0962,1759-1090,Isle_Us,1,0,0,1,NA,NA,Literature,OXFORD UNIV PRESS INC,2020-06-06 +islets,1938-2014,1938-2022,IsletsJournal,0,0,1,1,Endocrinology & Metabolism,NA,NA,TAYLOR & FRANCIS INC,2020-02-22 +isme journal,1751-7362,1751-7370,ISMEJournal,0,0,1,1,Ecology | Microbiology,NA,NA,SPRINGERNATURE,2012-11-19 +isokinetics and exercise science,0959-3020,1878-5913,NA,0,0,1,0,"Engineering, Biomedical | Orthopedics | Sport Sciences",NA,NA,IOS PRESS,NA +isotopes in environmental and health studies,1025-6016,1477-2639,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Environmental Sciences",NA,NA,TAYLOR & FRANCIS LTD,NA +isprs international journal of geo-information,2220-9964,2220-9964,NA,0,0,1,0,"Computer Science, Information Systems | Geography, Physical | Remote Sensing",NA,NA,MDPI,NA +isprs journal of photogrammetry and remote sensing,0924-2716,1872-8235,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary | Remote Sensing | Imaging Science & Photographic Technology",NA,NA,ELSEVIER,NA +israel affairs,1353-7121,1743-9086,NA,0,1,0,0,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +israel exploration journal,0021-2059,NA,NA,1,0,0,0,NA,NA,Archaeology,ISRAEL EXPLOR SOC,NA +israel journal of chemistry,0021-2148,1869-5868,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +israel journal of ecology & evolution,1565-9801,2224-4662,NA,0,0,1,0,Ecology | Evolutionary Biology,NA,NA,BRILL,NA +israel journal of health policy research,2045-4015,2045-4015,NA,0,1,0,0,NA,"Health Policy & Services | Public, Environmental & Occupational Health",NA,BMC,NA +israel journal of mathematics,0021-2172,1565-8511,NA,0,0,1,0,Mathematics,NA,NA,HEBREW UNIV MAGNES PRESS,NA +israel journal of plant sciences,0792-9978,2223-8980,NA,0,0,1,0,Plant Sciences,NA,NA,BRILL,NA +israel journal of psychiatry and related sciences,0333-7308,0333-7308,NA,0,1,1,0,Psychiatry,Psychiatry,NA,MEDIAFARM GROUP,NA +israel journal of psychiatry and related sciences,0333-7308,0333-7308,NA,0,1,1,0,Psychiatry,Psychiatry,NA,MEDIAFARM GROUP,NA +israel journal of veterinary medicine,0334-9152,2304-8859,NA,0,0,1,0,Veterinary Sciences,NA,NA,ISRAEL VETERINARY MEDICAL ASSOC,NA +israel medical association journal,1565-1088,1565-1088,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ISRAEL MEDICAL ASSOC JOURNAL,NA +israeli journal of aquaculture-bamidgeh,0792-156X,NA,NA,0,0,1,0,Fisheries,NA,NA,ISRAELI JOURNAL OF AQUACULTURE-BAMIDGEH,NA +issues in law & medicine,8756-8160,2377-6463,NA,0,1,0,0,NA,Law,NA,"NATL LEGAL CENTER MEDICALLY DEPENDENT & DISABLED INC",NA +issues in mental health nursing,0161-2840,1096-4673,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,TAYLOR & FRANCIS INC,NA +issues in mental health nursing,0161-2840,1096-4673,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,TAYLOR & FRANCIS INC,NA +issues in science and technology,0748-5492,1938-1557,ISSUESinST,0,1,1,1,"Engineering, Multidisciplinary | Engineering, Industrial | Multidisciplinary Sciences",Social Issues,NA,"NATL ACAD SCIENCES",2014-04-25 +issues in science and technology,0748-5492,1938-1557,ISSUESinST,0,1,1,1,"Engineering, Multidisciplinary | Engineering, Industrial | Multidisciplinary Sciences",Social Issues,NA,"NATL ACAD SCIENCES",2014-04-25 +it professional,1520-9202,1941-045X,ieeeitpro,0,0,1,1,"Computer Science, Information Systems | Computer Science, Software Engineering | Telecommunications",NA,NA,IEEE COMPUTER SOC,2009-07-31 +italian journal of agrometeorology-rivista italiana di agrometeorologia,2038-5625,2038-5625,NA,0,0,1,0,Agronomy | Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,FIRENZE UNIV PRESS,NA +italian journal of agronomy,1125-4718,2039-6805,NA,0,0,1,0,Agronomy,NA,NA,PAGEPRESS PUBL,NA +italian journal of animal science,1594-4077,1828-051X,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,TAYLOR & FRANCIS LTD,NA +italian journal of dermatology and venereology,2784-8671,2784-8450,NA,0,0,1,0,Dermatology,NA,NA,EDIZIONI MINERVA MEDICA,NA +italian journal of food science,1120-1770,2239-5687,itjfs,0,0,1,1,Food Science & Technology,NA,NA,CODON PUBLICATIONS,2020-05-10 +italian journal of geosciences,2038-1719,2038-1727,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SOC GEOLOGICA ITALIANA,NA +italian journal of pediatrics,1720-8424,1824-7288,NA,0,0,1,0,Pediatrics,NA,NA,BMC,NA +italian studies,0075-1634,1748-6181,NA,1,0,0,0,NA,NA,"Literature, Romance | Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +italianistica-rivista di letteratura italiana,0391-3368,1724-1677,NA,1,0,0,0,NA,NA,"Literature, Romance",FABRIZIO SERRA EDITORE,NA +ite journal-institute of transportation engineers,0162-8178,NA,NA,0,0,1,0,"Engineering, Civil | Transportation Science & Technology",NA,NA,INST TRANSPORTATION ENGINEERS,NA +itea-informacion tecnica economica agraria,1699-6887,NA,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Agronomy",NA,NA,ASOCIACION INTERPROFESIONAL DESARROLLO AGARIO,NA +itinerario-international journal on the history of european expansion and global interaction,0165-1153,2041-2827,Journal_Iti,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2018-08-23 +itinerario-international journal on the history of european expansion and global interaction,0165-1153,2041-2827,Journal_Iti,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2018-08-23 +iubmb life,1521-6543,1521-6551,iubmb_life,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,WILEY,2020-12-16 +iucrj,2052-2525,2052-2525,IUCrJ,0,0,1,1,"Chemistry, Multidisciplinary | Crystallography | Materials Science, Multidisciplinary",NA,NA,INT UNION CRYSTALLOGRAPHY,2013-02-25 +izvestiya-physics of the solid earth,1069-3513,1555-6506,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +izvestiya atmospheric and oceanic physics,0001-4338,1555-628X,NA,0,0,1,0,Meteorology & Atmospheric Sciences | Oceanography,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +izvestiya mathematics,1064-5632,1468-4810,NA,0,0,1,0,Mathematics,NA,NA,TURPION LTD,NA +j-for-journal of science & technology for forest products and processes,1927-6311,1927-632X,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,PULP & PAPER TECHNICAL ASSOC CANADA,NA +jaapa-journal of the american academy of physician assistants,1547-1896,0893-7400,JAAPAonline,0,0,1,1,"Medicine, General & Internal",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2009-04-13 +jacc-basic to translational science,2452-302X,2452-302X,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCIENCE INC,NA +jacc-cardiovascular imaging,1936-878X,1876-7591,NA,0,0,1,0,"Cardiac & Cardiovascular System | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,NA +jacc-cardiovascular interventions,1936-8798,1876-7605,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCIENCE INC,NA +jacc-clinical electrophysiology,2405-500X,2405-5018,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER,NA +jacc-heart failure,2213-1779,2213-1787,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCI LTD,NA +jacc: cardiooncology,2666-0873,2666-0873,NA,0,0,1,0,Oncology | Cardiac & Cardiovascular System,NA,NA,ELSEVIER,NA +jahrbuch der berliner museen,0075-2207,NA,NA,1,0,0,0,NA,NA,Art,GEBR MANN VERLAG,NA +jahrbuch fur internationale germanistik,0449-5233,2235-1280,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",VERLAG PETER LANG AG,NA +jahrbucher fur geschichte osteuropas,0021-4019,NA,JahrbuecherJGO,1,0,0,1,NA,NA,History,FRANZ STEINER VERLAG GMBH,2013-02-03 +jahrbucher fur nationalokonomie und statistik,0021-4027,2366-049X,NA,0,1,0,0,NA,"Economics | Social Sciences, Mathematical Methods",NA,WALTER DE GRUYTER GMBH,NA +jaids-journal of acquired immune deficiency syndromes,1525-4135,1077-9450,NA,0,0,1,0,Immunology | Infectious Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +jama-journal of the american medical association,0098-7484,1538-3598,JAMA_current,0,0,1,1,"Medicine, General & Internal",NA,NA,AMER MEDICAL ASSOC,2009-05-07 +jama cardiology,2380-6583,2380-6591,JAMACardio,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,AMER MEDICAL ASSOC,2015-08-11 +jama dermatology,2168-6068,2168-6084,JAMADerm,0,0,1,1,Dermatology,NA,NA,AMER MEDICAL ASSOC,2009-07-08 +jama internal medicine,2168-6106,2168-6114,JAMAInternalMed,0,0,1,1,"Medicine, General & Internal",NA,NA,AMER MEDICAL ASSOC,2009-07-07 +jama network open,2574-3805,2574-3805,JAMANetworkOpen,0,0,1,1,"Medicine, General & Internal",NA,NA,AMER MEDICAL ASSOC,2017-04-07 +jama neurology,2168-6149,2168-6157,JAMANeuro,0,0,1,1,Clinical Neurology,NA,NA,AMER MEDICAL ASSOC,2009-07-08 +jama oncology,2374-2437,2374-2445,JAMAOnc,0,0,1,1,Oncology,NA,NA,AMER MEDICAL ASSOC,2014-09-15 +jama ophthalmology,2168-6165,2168-6173,JAMAOphth,0,0,1,1,Ophthalmology,NA,NA,AMER MEDICAL ASSOC,2009-07-07 +jama otolaryngology-head & neck surgery,2168-6181,2168-619X,JAMAOto,0,0,1,1,Otorhinolaryngology | Surgery,NA,NA,AMER MEDICAL ASSOC,2009-07-07 +jama pediatrics,2168-6203,2168-6211,JAMAPediatrics,0,0,1,1,Pediatrics,NA,NA,AMER MEDICAL ASSOC,2009-07-06 +jama psychiatry,2168-622X,2168-6238,JAMAPsych,0,1,1,1,Psychiatry,Psychiatry,NA,AMER MEDICAL ASSOC,2009-07-08 +jama psychiatry,2168-622X,2168-6238,JAMAPsych,0,1,1,1,Psychiatry,Psychiatry,NA,AMER MEDICAL ASSOC,2009-07-08 +jama surgery,2168-6254,2168-6262,JAMASurgery,0,0,1,1,Surgery,NA,NA,AMER MEDICAL ASSOC,2009-07-08 +james joyce quarterly,0021-4183,1938-6036,NA,1,0,0,0,NA,NA,"Literature, British Isles",UNIV TULSA,NA +janac-journal of the association of nurses in aids care,1055-3290,1552-6917,ANACJournal,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-06-11 +janac-journal of the association of nurses in aids care,1055-3290,1552-6917,ANACJournal,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-06-11 +japan and the world economy,0922-1425,1879-2006,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +japan journal of industrial and applied mathematics,0916-7005,1868-937X,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER JAPAN KK,NA +japan journal of nursing science,1742-7932,1742-7924,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +japan journal of nursing science,1742-7932,1742-7924,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +japanese dental science review,1882-7616,2213-6851,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER SCI LTD,NA +japanese economic review,1352-4739,1468-5876,NA,0,1,0,0,NA,Economics,NA,SPRINGER HEIDELBERG,NA +japanese journal of applied entomology and zoology,0021-4914,1347-6068,NA,0,0,1,0,Entomology,NA,NA,JAPAN SOC APPL ENTOMOL ZOOL,NA +japanese journal of applied physics,0021-4922,1347-4065,NA,0,0,1,0,"Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +japanese journal of clinical oncology,0368-2811,1465-3621,NA,0,0,1,0,Oncology,NA,NA,OXFORD UNIV PRESS,NA +japanese journal of infectious diseases,1344-6304,1884-2836,NA,0,0,1,0,Infectious Diseases,NA,NA,"NATL INST INFECTIOUS DISEASES",NA +japanese journal of mathematics,0289-2316,1861-3624,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +japanese journal of ophthalmology,0021-5155,1613-2246,NA,0,0,1,0,Ophthalmology,NA,NA,SPRINGER JAPAN KK,NA +japanese journal of political science,1468-1099,1474-0060,jjps_eds,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2018-08-15 +japanese journal of radiology,1867-1071,1867-108X,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +japanese journal of religious studies,0304-1042,0304-1042,JJRS_NIRC,1,0,0,1,NA,NA,Religion,"NANZAN INST RELIGION CULTURE",2019-03-08 +japanese journal of veterinary research,0047-1917,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,HOKKAIDO UNIV,NA +japanese psychological research,0021-5368,1468-5884,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,WILEY,NA +jaro-journal of the association for research in otolaryngology,1525-3961,1438-7573,NA,0,0,1,0,Neurosciences | Otorhinolaryngology,NA,NA,SPRINGER,NA +jarq-japan agricultural research quarterly,0021-3551,2185-8896,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,JAPAN INT RESEARCH CENTER AGRICULTURAL SCIENCES,NA +jasss-the journal of artificial societies and social simulation,1460-7425,1460-7425,JASSSJournal,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,J A S S S,2015-11-02 +javma-journal of the american veterinary medical association,0003-1488,1943-569X,AVMAJournals,0,0,1,1,Veterinary Sciences,NA,NA,AMER VETERINARY MEDICAL ASSOC,NA +javnost-the public,1318-3222,1854-8377,NA,0,1,0,0,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +jci insight,2324-7703,2379-3708,JCI_insight,0,0,1,1,"Medicine, Research & Experimental",NA,NA,AMER SOC CLINICAL INVESTIGATION INC,2016-10-07 +jcms-journal of cinema and media studies,2578-4900,2578-4919,JCMSJournal,1,0,0,1,NA,NA,"Film, Radio, Television",UNIV TEXAS PRESS,2012-07-25 +jcms-journal of common market studies,0021-9886,1468-5965,JCMS_EU,0,1,0,1,NA,Economics | International Relations | Political Science,NA,WILEY,2014-11-17 +jco oncology practice,2688-1527,2688-1535,JCOOP_ASCO,0,0,1,1,Oncology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2016-01-27 +jco precision oncology,2473-4284,2473-4284,JCOPO_ASCO,0,0,1,1,Oncology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2016-07-01 +jcpsp-journal of the college of physicians and surgeons pakistan,1022-386X,1681-7168,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,COLL PHYSICIANS & SURGEONS PAKISTAN,NA +jcr-journal of clinical rheumatology,1076-1608,1536-7355,JRheumatology,0,0,1,1,Rheumatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2018-10-22 +jetp letters,0021-3640,1090-6487,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +jewish history,0334-701X,1572-8579,NA,1,0,0,0,NA,NA,History,SPRINGER,NA +jfr-journal of family research,NA,2699-2337,family_journal,0,1,0,1,NA,Family Studies,NA,OTTO FRIEDRICH UNIV BAMBERG PRESS,2019-10-15 +jmir medical informatics,2291-9694,2291-9694,JMIR_MedInform,0,0,1,1,Medical Informatics,NA,NA,"JMIR PUBLICATIONS, INC",2021-06-08 +jmir mental health,2368-7959,2368-7959,JMIR_JMH,0,0,1,1,Psychiatry,NA,NA,"JMIR PUBLICATIONS, INC",2021-06-08 +jmir mhealth and uhealth,2291-5222,2291-5222,JMIR_mHealth,0,0,1,1,Health Care Sciences & Services | Medical Informatics,NA,NA,"JMIR PUBLICATIONS, INC",2021-06-07 +jmir public health and surveillance,2369-2960,2369-2960,JMIR_PH,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"JMIR PUBLICATIONS, INC",2021-06-08 +jmir public health and surveillance,2369-2960,2369-2960,JMIR_PH,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"JMIR PUBLICATIONS, INC",2021-06-08 +jmir serious games,2291-9279,2291-9279,JMIRSeriousGame,0,0,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Medical Informatics",NA,NA,"JMIR PUBLICATIONS, INC",2021-05-17 +jnci-journal of the national cancer institute,0027-8874,1460-2105,JNCI_Now,0,0,1,1,Oncology,NA,NA,OXFORD UNIV PRESS INC,2009-04-29 +jnp-journal for nurse practitioners,1555-4155,1878-058X,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +jnp-journal for nurse practitioners,1555-4155,1878-058X,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +jnt-journal of narrative theory,1549-0815,1548-9248,NA,1,0,0,0,NA,NA,Literature,EASTERN MICHIGAN UNIV,NA +jognn-journal of obstetric gynecologic and neonatal nursing,0884-2175,1552-6909,JOGNN_journal,0,1,1,1,Nursing | Obstetrics & Gynecology,Nursing,NA,ELSEVIER SCIENCE INC,2014-04-22 +jognn-journal of obstetric gynecologic and neonatal nursing,0884-2175,1552-6909,JOGNN_journal,0,1,1,1,Nursing | Obstetrics & Gynecology,Nursing,NA,ELSEVIER SCIENCE INC,2014-04-22 +johnson matthey technology review,2056-5135,2056-5135,TechRevMatthey,0,0,1,1,"Chemistry, Physical",NA,NA,JOHNSON MATTHEY PUBL LTD CO,2013-04-10 +joint bone spine,1297-319X,1778-7254,NA,0,0,1,0,Rheumatology,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +joint diseases and related surgery,2687-4784,2687-4792,jointdrs,0,0,1,1,Surgery | Orthopedics,NA,NA,TURKISH JOINT DISEASES FOUNDATION,2021-03-19 +jokull,0449-0576,NA,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,ICELAND GLACIOLOGICAL SOC,NA +jom,1047-4838,1543-1851,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering | Mineralogy | Mining & Mineral Processing",NA,NA,SPRINGER,NA +jornal brasileiro de pneumologia,1806-3713,1806-3756,NA,0,0,1,0,Respiratory System,NA,NA,SOC BRASILEIRA PNEUMOLOGIA TISIOLOGIA,NA +jornal de pediatria,0021-7557,1678-4782,NA,0,0,1,0,Pediatrics,NA,NA,SOC BRASIL PEDIATRIA,NA +joule,2542-4351,2542-4351,Joule_CP,0,0,1,1,"Chemistry, Physical | Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,CELL PRESS,2017-02-16 +journal asiatique,0021-762X,1783-1504,NA,1,0,0,0,NA,NA,Asian Studies,PEETERS,NA +journal awwa,2164-4535,1551-8833,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,WILEY,NA +journal d analyse mathematique,0021-7670,1565-8538,NA,0,0,1,0,Mathematics,NA,NA,HEBREW UNIV MAGNES PRESS,NA +journal de mathematiques pures et appliquees,0021-7824,1776-3371,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ELSEVIER,NA +journal de mycologie medicale,1156-5233,1773-0449,NA,0,0,1,0,Mycology,NA,NA,MASSON EDITEUR,NA +journal de theorie des nombres de bordeaux,1246-7405,2118-8572,NA,0,0,1,0,Mathematics,NA,NA,"UNIV BORDEAUX, INST MATHEMATIQUES BORDEAUX",NA +journal der deutschen dermatologischen gesellschaft,1610-0379,1610-0387,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +journal for eighteenth-century studies,1754-0194,1754-0208,JECSjournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",WILEY,2015-01-19 +journal for general philosophy of science,0925-4560,1572-8587,NA,1,0,0,0,NA,NA,History & Philosophy Of Science,SPRINGER,NA +journal for healthcare quality,1062-2551,1945-1474,JHealthQuality,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,2019-05-04 +journal for healthcare quality,1062-2551,1945-1474,JHealthQuality,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,2019-05-04 +journal for immunotherapy of cancer,2051-1426,2051-1426,jitcancer,0,0,1,1,Oncology | Immunology,NA,NA,BMJ PUBLISHING GROUP,2019-07-15 +journal for nature conservation,1617-1381,1618-1093,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,ELSEVIER GMBH,NA +journal for research in mathematics education,0021-8251,1945-2306,NA,0,1,0,0,NA,Education & Educational Research,NA,"NATL COUNCIL TEACHERS MATHEMATICS-NCTM",NA +journal for specialists in pediatric nursing,1539-0136,1744-6155,NA,0,1,1,0,Nursing | Pediatrics,Nursing,NA,WILEY,NA +journal for specialists in pediatric nursing,1539-0136,1744-6155,NA,0,1,1,0,Nursing | Pediatrics,Nursing,NA,WILEY,NA +journal for the history of astronomy,0021-8286,1753-8556,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,NA +journal for the history of astronomy,0021-8286,1753-8556,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,NA +journal for the scientific study of religion,0021-8294,1468-5906,jssrjournal,1,1,0,1,NA,Sociology,Religion,WILEY,2016-05-23 +journal for the scientific study of religion,0021-8294,1468-5906,jssrjournal,1,1,0,1,NA,Sociology,Religion,WILEY,2016-05-23 +journal for the study of education and development,0210-3702,1578-4126,NA,0,1,0,0,NA,"Psychology, Educational | Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal for the study of judaism,0047-2212,1570-0631,NA,1,0,0,0,NA,NA,Religion | History,BRILL,NA +journal for the study of religions and ideologies,1583-0039,1583-0039,NA,1,0,0,0,NA,NA,Religion,UNIV BABES-BOLYAI,NA +journal for the study of the historical jesus,1476-8690,1745-5197,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +journal for the study of the new testament,0142-064X,1745-5294,NA,1,0,0,0,NA,NA,Religion,SAGE PUBLICATIONS LTD,NA +journal for the study of the old testament,0309-0892,1476-6728,NA,1,0,0,0,NA,NA,Religion,SAGE PUBLICATIONS LTD,NA +journal for the theory of social behaviour,0021-8308,1468-5914,NA,0,1,0,0,NA,"Psychology, Social",NA,WILEY,NA +journal francais d ophtalmologie,0181-5512,1773-0597,NA,0,0,1,0,Ophthalmology,NA,NA,MASSON EDITEUR,NA +journal fur die reine und angewandte mathematik,0075-4102,1435-5345,NA,0,0,1,0,Mathematics,NA,NA,WALTER DE GRUYTER GMBH,NA +journal of aapos,1091-8531,1528-3933,NA,0,0,1,0,Ophthalmology | Pediatrics,NA,NA,MOSBY-ELSEVIER,NA +journal of abnormal psychology,0021-843X,1939-1846,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of academic librarianship,0099-1333,1879-1999,NA,0,1,0,0,NA,Information Science & Library Science,NA,ELSEVIER SCIENCE INC,NA +journal of accounting & economics,0165-4101,1879-1980,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +journal of accounting and public policy,0278-4254,1873-2070,NA,0,1,0,0,NA,"Business, Finance | Public Administration",NA,ELSEVIER SCIENCE INC,NA +journal of accounting research,0021-8456,1475-679X,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +journal of addiction medicine,1932-0620,1935-3227,JAM_ASAM,0,0,1,1,Substance Abuse,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-02-14 +journal of addictions nursing,1088-4602,1548-7148,NA,0,1,1,0,Substance Abuse | Nursing,Substance Abuse | Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of addictions nursing,1088-4602,1548-7148,NA,0,1,1,0,Substance Abuse | Nursing,Substance Abuse | Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of addictive diseases,1055-0887,1545-0848,JAD_AOAAM,0,1,0,1,NA,Substance Abuse,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-06-24 +journal of adhesion,0021-8464,1545-5823,NA,0,0,1,0,"Engineering, Chemical | Materials Science, Multidisciplinary | Mechanics",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of adhesion science and technology,0169-4243,1568-5616,NA,0,0,1,0,"Engineering, Chemical | Materials Science, Multidisciplinary | Mechanics",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of adhesive dentistry,1461-5185,1757-9988,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +journal of adolescence,0140-1971,1095-9254,AdolescenceJ,0,1,0,1,NA,"Psychology, Development",NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,2016-07-08 +journal of adolescent & adult literacy,1081-3004,1936-2706,NA,0,1,0,0,NA,Education & Educational Research,NA,WILEY,NA +journal of adolescent and young adult oncology,2156-5333,2156-535X,NA,0,0,1,0,Oncology,NA,NA,"MARY ANN LIEBERT, INC",NA +journal of adolescent health,1054-139X,1879-1972,JAdolesHealth,0,1,1,1,"Public, Environmental & Occupational Health | Pediatrics","Public, Environmental & Occupational Health | Psychology, Development",NA,ELSEVIER SCIENCE INC,2013-04-11 +journal of adolescent health,1054-139X,1879-1972,JAdolesHealth,0,1,1,1,"Public, Environmental & Occupational Health | Pediatrics","Public, Environmental & Occupational Health | Psychology, Development",NA,ELSEVIER SCIENCE INC,2013-04-11 +journal of adolescent research,0743-5584,1552-6895,NA,0,1,0,0,NA,"Psychology, Development",NA,SAGE PUBLICATIONS INC,NA +journal of adult development,1068-0667,1573-3440,NA,0,1,0,0,NA,"Psychology, Development",NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of advanced ceramics,2226-4108,2227-8508,JAC_Journal,0,0,1,1,"Materials Science, Ceramics",NA,NA,SPRINGER,2019-06-20 +journal of advanced concrete technology,1346-8014,1347-3913,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,JAPAN CONCRETE INST,NA +journal of advanced mechanical design systems and manufacturing,1881-3054,1881-3054,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Mechanical",NA,NA,JAPAN SOC MECHANICAL ENGINEERS,NA +journal of advanced nursing,0309-2402,1365-2648,jadvnursing,0,1,1,1,Nursing,Nursing,NA,WILEY,2011-04-13 +journal of advanced nursing,0309-2402,1365-2648,jadvnursing,0,1,1,1,Nursing,Nursing,NA,WILEY,2011-04-13 +journal of advanced prosthodontics,2005-7806,2005-7814,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,KOREAN ACAD PROSTHODONTICS,NA +journal of advanced research,2090-1232,2090-1224,jarcuhala,0,0,1,1,Multidisciplinary Sciences,NA,NA,ELSEVIER,2014-03-11 +journal of advanced transportation,0197-6729,2042-3195,NA,0,0,1,0,"Engineering, Civil | Transportation Science & Technology",NA,NA,WILEY-HINDAWI,NA +journal of advances in modeling earth systems,1942-2466,1942-2466,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,AMER GEOPHYSICAL UNION,NA +journal of advertising,0091-3367,1557-7805,NA,0,1,0,0,NA,Business | Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of advertising research,0021-8499,1740-1909,NA,0,1,0,0,NA,Business | Communication,NA,ADVERTISING RESEARCH FOUNDATION,NA +journal of aerosol medicine and pulmonary drug delivery,1941-2711,1941-2703,NA,0,0,1,0,Respiratory System,NA,NA,"MARY ANN LIEBERT, INC",NA +journal of aerosol science,0021-8502,1879-1964,NA,0,0,1,0,"Engineering, Chemical | Engineering, Mechanical | Environmental Sciences | Meteorology & Atmospheric Sciences",NA,NA,ELSEVIER SCI LTD,NA +journal of aerospace engineering,0893-1321,1943-5525,NA,0,0,1,0,"Engineering, Aerospace | Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of aerospace information systems,1940-3151,2327-3097,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,AMER INST AERONAUTICS ASTRONAUTICS,NA +journal of aesthetic education,0021-8510,1543-7809,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV ILLINOIS PRESS,NA +journal of aesthetics and art criticism,0021-8529,1540-6245,NA,1,0,0,0,NA,NA,Philosophy | Art,OXFORD UNIV PRESS,NA +journal of affective disorders,0165-0327,1573-2517,NA,0,1,1,0,Clinical Neurology | Psychiatry,Psychiatry,NA,ELSEVIER,NA +journal of affective disorders,0165-0327,1573-2517,NA,0,1,1,0,Clinical Neurology | Psychiatry,Psychiatry,NA,ELSEVIER,NA +journal of african archaeology,1612-1651,2191-5784,J_AfricanArch,1,0,0,1,NA,NA,Archaeology,AFRICA MAGNA VERLAG,2021-01-30 +journal of african cultural studies,1369-6815,1469-9346,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of african cultural studies,1369-6815,1469-9346,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of african earth sciences,1464-343X,1879-1956,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of african economies,0963-8024,1464-3723,NA,0,1,0,0,NA,Economics,NA,OXFORD UNIV PRESS,NA +journal of african history,0021-8537,1469-5138,jah_editors,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2016-02-08 +journal of african history,0021-8537,1469-5138,jah_editors,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2016-02-08 +journal of african languages and linguistics,0167-6164,1613-3811,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +journal of african languages and linguistics,0167-6164,1613-3811,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +journal of african law,0021-8553,1464-3731,j_africanlaw,0,1,0,1,NA,Law,NA,CAMBRIDGE UNIV PRESS,2014-08-19 +journal of african media studies,2040-199X,1751-7974,NA,1,1,0,0,NA,Cultural Studies | Communication,"Cultural Studies | Film, Radio, Television",INTELLECT LTD,NA +journal of african media studies,2040-199X,1751-7974,NA,1,1,0,0,NA,Cultural Studies | Communication,"Cultural Studies | Film, Radio, Television",INTELLECT LTD,NA +journal of aggression maltreatment & trauma,1092-6771,1545-083X,NA,0,1,0,0,NA,"Psychology, Clinical | Criminology & Penology | Family Studies | Psychiatry",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of aging & social policy,0895-9420,1545-0821,NA,0,1,0,0,NA,Gerontology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of aging and health,0898-2643,1552-6887,NA,0,1,0,0,NA,Gerontology | Health Policy & Services,NA,SAGE PUBLICATIONS INC,NA +journal of aging and physical activity,1063-8652,1543-267X,JAPAjournal,0,1,1,1,Geriatrics & Gerontology | Sport Sciences,Gerontology,NA,HUMAN KINETICS PUBL INC,2020-09-09 +journal of aging and physical activity,1063-8652,1543-267X,JAPAjournal,0,1,1,1,Geriatrics & Gerontology | Sport Sciences,Gerontology,NA,HUMAN KINETICS PUBL INC,2020-09-09 +journal of aging studies,0890-4065,1879-193X,NA,0,1,0,0,NA,Gerontology,NA,ELSEVIER SCIENCE INC,NA +journal of agrarian change,1471-0358,1471-0366,AgrarianChange,0,1,0,1,NA,Development Studies | Economics,NA,WILEY,2014-02-18 +journal of agricultural & environmental ethics,1187-7863,1573-322X,NA,1,1,1,0,"History & Philosophy Of Science | Agriculture, Multidisciplinary | Environmental Sciences",Ethics,History & Philosophy Of Science,SPRINGER,NA +journal of agricultural & environmental ethics,1187-7863,1573-322X,NA,1,1,1,0,"History & Philosophy Of Science | Agriculture, Multidisciplinary | Environmental Sciences",Ethics,History & Philosophy Of Science,SPRINGER,NA +journal of agricultural & environmental ethics,1187-7863,1573-322X,NA,1,1,1,0,"History & Philosophy Of Science | Agriculture, Multidisciplinary | Environmental Sciences",Ethics,History & Philosophy Of Science,SPRINGER,NA +journal of agricultural and food chemistry,0021-8561,1520-5118,NA,0,0,1,0,"Agriculture, Multidisciplinary | Chemistry, Applied | Food Science & Technology",NA,NA,AMER CHEMICAL SOC,NA +journal of agricultural and resource economics,1068-5502,2327-8285,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,WESTERN AGRICULTURAL ECONOMICS ASSOC,NA +journal of agricultural and resource economics,1068-5502,2327-8285,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,WESTERN AGRICULTURAL ECONOMICS ASSOC,NA +journal of agricultural biological and environmental statistics,1085-7117,1537-2693,NA,0,0,1,0,Biology | Mathematical & Computational Biology | Statistics & Probability,NA,NA,SPRINGER,NA +journal of agricultural economics,0021-857X,1477-9552,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,WILEY,NA +journal of agricultural economics,0021-857X,1477-9552,NA,0,1,1,0,Agricultural Economics & Policy,Economics,NA,WILEY,NA +journal of agricultural education & extension,1389-224X,1750-8622,jaee_ecs,0,1,0,1,NA,Education & Educational Research | Environmental Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-02-24 +journal of agricultural engineering,1974-7071,2239-6268,NA,0,0,1,0,Agricultural Engineering,NA,NA,PAGEPRESS PUBL,NA +journal of agricultural meteorology,0021-8588,1881-0136,NA,0,0,1,0,"Agriculture, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,SOC AGRICULTURAL METEOROLOGY JAPAN,NA +journal of agricultural science,0021-8596,1469-5146,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of agricultural science and technology,1680-7073,2345-3737,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,TARBIAT MODARES UNIV,NA +journal of agricultural sciences-tarim bilimleri dergisi,NA,2148-9297,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,"ANKARA UNIV, FAC AGR",NA +journal of agromedicine,1059-924X,1545-0813,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,TAYLOR & FRANCIS INC,NA +journal of agronomy and crop science,0931-2250,1439-037X,NA,0,0,1,0,Agronomy,NA,NA,WILEY,NA +journal of air transport management,0969-6997,1873-2089,NA,0,1,0,0,NA,Transportation,NA,ELSEVIER SCI LTD,NA +journal of aircraft,0021-8669,1533-3868,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,AMER INST AERONAUTICS ASTRONAUTICS,NA +journal of algebra,0021-8693,1090-266X,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of algebra and its applications,0219-4988,1793-6829,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of algebraic combinatorics,0925-9899,1572-9192,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +journal of algebraic geometry,1056-3911,1534-7486,NA,0,0,1,0,Mathematics,NA,NA,UNIV PRESS INC,NA +journal of allergy and clinical immunology,0091-6749,1097-6825,jacionline,0,0,1,1,Allergy | Immunology,NA,NA,MOSBY-ELSEVIER,2010-04-16 +journal of allergy and clinical immunology-in practice,2213-2198,2213-2201,NA,0,0,1,0,Allergy | Immunology,NA,NA,ELSEVIER,NA +journal of alloys and compounds,0925-8388,1873-4669,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,ELSEVIER SCIENCE SA,NA +journal of alternative and complementary medicine,1075-5535,1557-7708,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,"MARY ANN LIEBERT, INC",NA +journal of alzheimers disease,1387-2877,1875-8908,NA,0,0,1,0,Neurosciences,NA,NA,IOS PRESS,NA +journal of ambient intelligence and humanized computing,1868-5137,1868-5145,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Telecommunications",NA,NA,SPRINGER HEIDELBERG,NA +journal of ambient intelligence and smart environments,1876-1364,1876-1372,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Telecommunications",NA,NA,IOS PRESS,NA +journal of american college health,0744-8481,1940-3208,NA,0,1,0,0,NA,"Education & Educational Research | Public, Environmental & Occupational Health",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of american ethnic history,0278-5927,1936-4695,JournlAmEthHist,1,0,0,1,NA,NA,History,UNIV ILLINOIS PRESS,2018-04-24 +journal of american folklore,0021-8715,1535-1882,NA,1,0,0,0,NA,NA,Folklore,AMER FOLKLORE SOC,NA +journal of american history,0021-8723,1945-2314,journamhist,1,1,0,1,NA,History,History,OXFORD UNIV PRESS INC,2014-10-07 +journal of american history,0021-8723,1945-2314,journamhist,1,1,0,1,NA,History,History,OXFORD UNIV PRESS INC,2014-10-07 +journal of american studies,0021-8758,1469-5154,jnlamstudies,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",CAMBRIDGE UNIV PRESS,2009-03-18 +journal of analytical and applied pyrolysis,0165-2370,1873-250X,NA,0,0,1,0,"Chemistry, Analytical | Energy & Fuels | Engineering, Chemical",NA,NA,ELSEVIER,NA +journal of analytical atomic spectrometry,0267-9477,1364-5544,NA,0,0,1,0,"Chemistry, Analytical | Spectroscopy",NA,NA,ROYAL SOC CHEMISTRY,NA +journal of analytical chemistry,1061-9348,1608-3199,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,PLEIADES PUBLISHING INC,NA +journal of analytical methods in chemistry,2090-8865,2090-8873,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,HINDAWI LTD,NA +journal of analytical science and technology,2093-3134,2093-3371,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,SPRINGER INT PUBL AG,NA +journal of analytical toxicology,0146-4760,1945-2403,JAnalyticalTox,0,0,1,1,"Chemistry, Analytical | Toxicology",NA,NA,OXFORD UNIV PRESS INC,2018-02-13 +journal of anatomy,0021-8782,1469-7580,JAnatomy,0,0,1,1,Anatomy & Morphology,NA,NA,WILEY,2010-11-24 +journal of ancient near eastern religions,1569-2116,1569-2124,NA,1,0,0,0,NA,NA,History | Religion,BRILL,NA +journal of anesthesia,0913-8668,1438-8359,NA,0,0,1,0,Anesthesiology,NA,NA,SPRINGER JAPAN KK,NA +journal of anglican studies,1740-3553,1745-5278,NA,1,0,0,0,NA,NA,Religion,CAMBRIDGE UNIV PRESS,NA +journal of animal and feed sciences,1230-1388,1230-1388,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,KIELANOWSKI INST ANIMAL PHYSIOLOGY NUTRITION,NA +journal of animal and plant sciences-japs,1018-7081,2309-8694,NA,0,0,1,0,"Agriculture, Multidisciplinary | Veterinary Sciences",NA,NA,PAKISTAN AGRICULTURAL SCIENTISTS FORUM,NA +journal of animal breeding and genetics,0931-2668,1439-0388,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,WILEY,NA +journal of animal ecology,0021-8790,1365-2656,AnimalEcology,0,0,1,1,Ecology | Zoology,NA,NA,WILEY,2009-11-05 +journal of animal physiology and animal nutrition,0931-2439,1439-0396,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,WILEY,NA +journal of animal science,0021-8812,1525-3163,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,OXFORD UNIV PRESS INC,NA +journal of animal science and biotechnology,1674-9782,2049-1891,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,BMC,NA +journal of animal science and technology,2672-0191,2055-0391,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,KOREAN SOCIETY ANIMAL SCIENCE & TECHNOLOGY,NA +journal of anthropological archaeology,0278-4165,1090-2686,NA,1,1,0,0,NA,Anthropology,Archaeology,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of anthropological archaeology,0278-4165,1090-2686,NA,1,1,0,0,NA,Anthropology,Archaeology,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of anthropological research,0091-7710,2153-3806,NA,0,1,0,0,NA,Anthropology,NA,UNIV CHICAGO PRESS,NA +journal of anthropological sciences,1827-4765,2037-0644,NA,0,1,0,0,NA,Anthropology,NA,IST ITALIANO ANTROPOLOGIA,NA +journal of antibiotics,0021-8820,1881-1469,NA,0,0,1,0,Biotechnology & Applied Microbiology | Immunology | Microbiology | Pharmacology & Pharmacy,NA,NA,SPRINGERNATURE,NA +journal of antimicrobial chemotherapy,0305-7453,1460-2091,NA,0,0,1,0,Infectious Diseases | Microbiology | Pharmacology & Pharmacy,NA,NA,OXFORD UNIV PRESS,NA +journal of anxiety disorders,0887-6185,1873-7897,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of aoac international,1060-3271,1944-7922,NA,0,0,1,0,"Chemistry, Analytical | Food Science & Technology",NA,NA,OXFORD UNIV PRESS INC,NA +journal of apicultural research,0021-8839,2078-6913,NA,0,0,1,0,Entomology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of apicultural science,1643-4439,2299-4831,NA,0,0,1,0,Entomology,NA,NA,SCIENDO,NA +journal of applied analysis and computation,2156-907X,2158-5644,NA,0,0,1,0,"Mathematics, Applied",NA,NA,"WILMINGTON SCIENTIFIC PUBLISHER, LLC",NA +journal of applied animal research,0971-2119,0974-1844,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of applied animal welfare science,1088-8705,1532-7604,NA,0,0,1,0,Veterinary Sciences,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of applied behavior analysis,0021-8855,1938-3703,NA,0,1,0,0,NA,"Psychology, Clinical",NA,WILEY,NA +journal of applied behavioral science,0021-8863,1552-6879,JABS_Journal,0,1,0,1,NA,"Psychology, Applied | Management",NA,SAGE PUBLICATIONS INC,2019-11-19 +journal of applied biomaterials & functional materials,2280-8000,2280-8000,NA,0,0,1,0,"Biophysics | Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of applied biomechanics,1065-8483,1543-2688,JApplBiomech,0,0,1,1,"Engineering, Biomedical | Sport Sciences",NA,NA,HUMAN KINETICS PUBL INC,2017-01-24 +journal of applied biomedicine,1214-021X,1214-0287,NA,0,0,1,0,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,UNIV SOUTH BOHEMIA,NA +journal of applied botany and food quality,1439-040X,1439-040X,JAB_FQ,0,0,1,1,Plant Sciences,NA,NA,DRUCKEREI LIDDY HALM,2019-09-04 +journal of applied clinical medical physics,1526-9914,1526-9914,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,NA +journal of applied communication research,0090-9882,1479-5752,jappliedcommres,0,1,0,1,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-02-11 +journal of applied crystallography,0021-8898,1600-5767,JApplCryst,0,0,1,1,"Chemistry, Multidisciplinary | Crystallography",NA,NA,INT UNION CRYSTALLOGRAPHY,2012-05-22 +journal of applied developmental psychology,0193-3973,1873-7900,NA,0,1,0,0,NA,"Psychology, Development",NA,ELSEVIER SCIENCE INC,NA +journal of applied ecology,0021-8901,1365-2664,JAppliedEcology,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,WILEY,2009-11-05 +journal of applied econometrics,0883-7252,1099-1255,NA,0,1,0,0,NA,"Economics | Social Sciences, Mathematical Methods",NA,WILEY,NA +journal of applied economics,1514-0326,1667-6726,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of applied electrochemistry,0021-891X,1572-8838,NA,0,0,1,0,Electrochemistry,NA,NA,SPRINGER,NA +journal of applied entomology,0931-2048,1439-0418,JApplEntomol,0,0,1,1,Entomology,NA,NA,WILEY,2021-12-17 +journal of applied fluid mechanics,1735-3572,1735-3645,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,ISFAHAN UNIV TECHNOLOGY,NA +journal of applied genetics,1234-1983,2190-3883,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,SPRINGER HEIDELBERG,NA +journal of applied geophysics,0926-9851,1879-1859,NA,0,0,1,0,"Geosciences, Multidisciplinary | Mining & Mineral Processing",NA,NA,ELSEVIER,NA +journal of applied gerontology,0733-4648,1552-4523,NA,0,1,0,0,NA,Gerontology,NA,SAGE PUBLICATIONS INC,NA +journal of applied ichthyology,0175-8659,1439-0426,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,WILEY,NA +journal of applied mathematics and computing,1598-5865,1865-2085,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER HEIDELBERG,NA +journal of applied mechanics-transactions of the asme,0021-8936,1528-9036,NA,0,0,1,0,Mechanics,NA,NA,ASME,NA +journal of applied mechanics and technical physics,0021-8944,1573-8620,NA,0,0,1,0,"Mechanics | Physics, Applied",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +journal of applied meteorology and climatology,1558-8424,1558-8432,AMSJAMC,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,AMER METEOROLOGICAL SOC,2020-10-02 +journal of applied microbiology,1364-5072,1365-2672,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,WILEY,NA +journal of applied oral science,1678-7757,1678-7765,JournalJAOS,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,UNIV SAO PAULO FAC ODONTOLOGIA BAURU,2019-09-10 +journal of applied philosophy,0264-3758,1468-5930,JoAPhilosophy,1,1,0,1,NA,Ethics,Philosophy,WILEY,2013-11-12 +journal of applied philosophy,0264-3758,1468-5930,JoAPhilosophy,1,1,0,1,NA,Ethics,Philosophy,WILEY,2013-11-12 +journal of applied phycology,0921-8971,1573-5176,NA,0,0,1,0,Biotechnology & Applied Microbiology | Marine & Freshwater Biology,NA,NA,SPRINGER,NA +journal of applied physics,0021-8979,1089-7550,NA,0,0,1,0,"Physics, Applied",NA,NA,AIP PUBLISHING,NA +journal of applied physiology,8750-7587,1522-1601,japplphysiol,0,0,1,1,Physiology | Sport Sciences,NA,NA,AMER PHYSIOLOGICAL SOC,2013-11-06 +journal of applied polymer science,0021-8995,1097-4628,NA,0,0,1,0,Polymer Science,NA,NA,WILEY,NA +journal of applied poultry research,1056-6171,1537-0437,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,ELSEVIER,NA +journal of applied probability,0021-9002,1475-6072,NA,0,0,1,0,Statistics & Probability,NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of applied psychology,0021-9010,1939-1854,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of applied remote sensing,1931-3195,1931-3195,NA,0,0,1,0,Environmental Sciences | Remote Sensing | Imaging Science & Photographic Technology,NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +journal of applied research in intellectual disabilities,1360-2322,1468-3148,_JARID_,0,1,0,1,NA,"Psychology, Educational | Rehabilitation",NA,WILEY,2014-07-31 +journal of applied research in memory and cognition,2211-3681,2211-369X,NA,0,1,0,0,NA,"Psychology, Experimental",NA,ELSEVIER SCIENCE INC,NA +journal of applied research on medicinal and aromatic plants,2214-7861,2214-7861,NA,0,0,1,0,Plant Sciences,NA,NA,ELSEVIER,NA +journal of applied social psychology,0021-9029,1559-1816,NA,0,1,0,0,NA,"Psychology, Social",NA,WILEY,NA +journal of applied spectroscopy,0021-9037,1573-8647,NA,0,0,1,0,Spectroscopy,NA,NA,SPRINGER,NA +journal of applied sport psychology,1041-3200,1533-1571,JAppSportPsych,0,1,1,1,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,TAYLOR & FRANCIS LTD,2018-04-03 +journal of applied sport psychology,1041-3200,1533-1571,JAppSportPsych,0,1,1,1,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,TAYLOR & FRANCIS LTD,2018-04-03 +journal of applied statistics,0266-4763,1360-0532,JAppliedStats,0,0,1,1,Statistics & Probability,NA,NA,TAYLOR & FRANCIS LTD,2017-09-13 +journal of applied toxicology,0260-437X,1099-1263,NA,0,0,1,0,Toxicology,NA,NA,WILEY,NA +journal of approximation theory,0021-9045,1096-0430,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of aquatic animal health,0899-7659,1548-8667,NA,0,0,1,0,Fisheries | Veterinary Sciences,NA,NA,WILEY,NA +journal of aquatic food product technology,1049-8850,1547-0636,NA,0,0,1,0,Food Science & Technology,NA,NA,TAYLOR & FRANCIS INC,NA +journal of aquatic plant management,0146-6623,0146-6623,NA,0,0,1,0,Plant Sciences | Marine & Freshwater Biology,NA,NA,"AQUATIC PLANT MANAGEMENT SOC, INC",NA +journal of arabic literature,0085-2376,1570-064X,NA,1,0,0,0,NA,NA,Literature | Asian Studies,BRILL,NA +journal of arachnology,0161-8202,1937-2396,NA,0,0,1,0,Entomology,NA,NA,AMER ARACHNOLOGICAL SOC,NA +journal of archaeological method and theory,1072-5369,1573-7764,NA,1,1,0,0,NA,Anthropology,Archaeology,SPRINGER,NA +journal of archaeological method and theory,1072-5369,1573-7764,NA,1,1,0,0,NA,Anthropology,Archaeology,SPRINGER,NA +journal of archaeological research,1059-0161,1573-7756,NA,1,1,0,0,NA,Anthropology,Archaeology,SPRINGER,NA +journal of archaeological research,1059-0161,1573-7756,NA,1,1,0,0,NA,Anthropology,Archaeology,SPRINGER,NA +journal of archaeological science,0305-4403,1095-9238,NA,1,1,1,0,"Geosciences, Multidisciplinary",Anthropology,Archaeology,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of archaeological science,0305-4403,1095-9238,NA,1,1,1,0,"Geosciences, Multidisciplinary",Anthropology,Archaeology,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of archaeological science,0305-4403,1095-9238,NA,1,1,1,0,"Geosciences, Multidisciplinary",Anthropology,Archaeology,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of archaeological science-reports,2352-409X,2352-409X,NA,1,0,0,0,NA,NA,Archaeology,ELSEVIER,NA +journal of architectural and planning research,0738-0895,NA,NA,0,1,0,0,NA,Environmental Studies | Regional & Urban Planning | Urban Studies,NA,LOCKE SCIENCE PUBL CO INC,NA +journal of architectural conservation,1355-6207,2326-6384,NA,1,0,0,0,NA,NA,Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of architectural education,1046-4883,1531-314X,NA,1,0,0,0,NA,NA,Architecture,TAYLOR & FRANCIS INC,NA +journal of architecture,1360-2365,1466-4410,JournalofArch,1,0,0,1,NA,NA,Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-02-28 +journal of arid environments,0140-1963,1095-922X,NA,0,0,1,0,Ecology | Environmental Sciences,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of arid land,1674-6767,2194-7783,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER HEIDELBERG,NA +journal of arthroplasty,0883-5403,1532-8406,JArthroplasty,0,0,1,1,Orthopedics,NA,NA,CHURCHILL LIVINGSTONE INC MEDICAL PUBLISHERS,2017-06-02 +journal of arthropod-borne diseases,2322-1984,2322-2271,NA,0,0,1,0,"Public, Environmental & Occupational Health | Parasitology",NA,NA,IRANIAN SCIENTIFIC SOCIETY MEDICAL ENTOMOLOGY,NA +journal of artificial intelligence and soft computing research,2083-2567,2449-6499,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SCIENDO,NA +journal of artificial intelligence research,1076-9757,1943-5037,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,AI ACCESS FOUNDATION,NA +journal of artificial organs,1434-7229,1619-0904,NA,0,0,1,0,"Engineering, Biomedical | Transplantation",NA,NA,SPRINGER JAPAN KK,NA +journal of arts management law and society,1063-2921,1930-7799,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of asia-pacific entomology,1226-8615,1876-7990,NA,0,0,1,0,Entomology,NA,NA,KOREAN SOC APPLIED ENTOMOLOGY,NA +journal of asian and african studies,0021-9096,1745-2538,jaastudies,0,1,0,1,NA,Area Studies,NA,SAGE PUBLICATIONS INC,2017-10-18 +journal of asian architecture and building engineering,1346-7581,1347-2852,NA,1,0,1,0,Construction & Building Technology,NA,Architecture,TAYLOR & FRANCIS LTD,NA +journal of asian architecture and building engineering,1346-7581,1347-2852,NA,1,0,1,0,Construction & Building Technology,NA,Architecture,TAYLOR & FRANCIS LTD,NA +journal of asian ceramic societies,2187-0764,2187-0764,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of asian earth sciences,1367-9120,1878-5786,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of asian economics,1049-0078,1873-7927,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +journal of asian history,0021-910X,0021-910X,NA,1,0,0,0,NA,NA,History | Asian Studies,VERLAG OTTO HARRASSOWITZ,NA +journal of asian natural products research,1028-6020,1477-2213,NA,0,0,1,0,"Plant Sciences | Chemistry, Applied | Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of asian public policy,1751-6234,1751-6242,NA,0,1,0,0,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of asian studies,0021-9118,1752-0401,jas_tw,1,1,0,1,NA,Area Studies,Asian Studies,CAMBRIDGE UNIV PRESS,2012-01-11 +journal of asian studies,0021-9118,1752-0401,jas_tw,1,1,0,1,NA,Area Studies,Asian Studies,CAMBRIDGE UNIV PRESS,2012-01-11 +journal of assisted reproduction and genetics,1058-0468,1573-7330,NA,0,0,1,0,Genetics & Heredity | Obstetrics & Gynecology | Reproductive Biology,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of asthma,0277-0903,1532-4303,NA,0,0,1,0,Allergy | Respiratory System,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of asthma and allergy,1178-6965,1178-6965,NA,0,0,1,0,Allergy | Immunology | Respiratory System,NA,NA,DOVE MEDICAL PRESS LTD,NA +journal of astronomical telescopes instruments and systems,2329-4124,2329-4221,NA,0,0,1,0,"Engineering, Aerospace | Instruments & Instrumentation | Optics",NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +journal of astrophysics and astronomy,0250-6335,0973-7758,AstrophyJournal,0,0,1,1,Astronomy & Astrophysics,NA,NA,INDIAN ACAD SCIENCES,2021-01-19 +journal of atherosclerosis and thrombosis,1340-3478,1880-3873,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,JAPAN ATHEROSCLEROSIS SOC,NA +journal of athletic training,1062-6050,1938-162X,JAT_NATA,0,0,1,1,Sport Sciences,NA,NA,"NATL ATHLETIC TRAINERS ASSOC INC",2017-12-20 +journal of atmospheric and oceanic technology,0739-0572,1520-0426,AMS_JTECH,0,0,1,1,"Engineering, Ocean | Meteorology & Atmospheric Sciences",NA,NA,AMER METEOROLOGICAL SOC,2020-10-02 +journal of atmospheric and solar-terrestrial physics,1364-6826,1879-1824,NA,0,0,1,0,Geochemistry & Geophysics | Meteorology & Atmospheric Sciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of atmospheric chemistry,0167-7764,1573-0662,NA,0,0,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,SPRINGER,NA +journal of attention disorders,1087-0547,1557-1246,NA,0,1,1,0,Psychiatry,"Psychiatry | Psychology, Development",NA,SAGE PUBLICATIONS INC,NA +journal of attention disorders,1087-0547,1557-1246,NA,0,1,1,0,Psychiatry,"Psychiatry | Psychology, Development",NA,SAGE PUBLICATIONS INC,NA +journal of australian political economy,0156-5826,1839-3675,NA,0,1,0,0,NA,Economics | Political Science,NA,AUSTRALIAN POLITICAL ECONOMY MOVEMENT,NA +journal of australian studies,1444-3058,1835-6419,aus_journal,1,1,0,1,NA,Cultural Studies | History | Area Studies,History | Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-06-24 +journal of australian studies,1444-3058,1835-6419,aus_journal,1,1,0,1,NA,Cultural Studies | History | Area Studies,History | Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-06-24 +journal of autism and developmental disorders,0162-3257,1573-3432,NA,0,1,0,0,NA,"Psychology, Development",NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of autoimmunity,0896-8411,1095-9157,NA,0,0,1,0,Immunology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of automated reasoning,0168-7433,1573-0670,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER,NA +journal of avian biology,0908-8857,1600-048X,AvianBiology,0,0,1,1,Ornithology,NA,NA,WILEY,2012-10-03 +journal of avian medicine and surgery,1082-6742,1938-2871,NA,0,0,1,0,Veterinary Sciences,NA,NA,ASSOC AVIAN VETERINARIANS,NA +journal of back and musculoskeletal rehabilitation,1053-8127,1878-6324,NA,0,0,1,0,Orthopedics | Rehabilitation,NA,NA,IOS PRESS,NA +journal of bacteriology,0021-9193,1098-5530,JBacteriology,0,0,1,1,Microbiology,NA,NA,AMER SOC MICROBIOLOGY,2015-12-28 +journal of balkan and near eastern studies,1944-8953,1944-8961,NA,0,1,0,0,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of baltic science education,1648-3898,1648-3898,NA,0,1,0,0,NA,Education & Educational Research,NA,SCI METHODICAL CTR-SCI EDUCOLOGICA,NA +journal of baltic studies,0162-9778,1751-7877,NA,0,1,0,0,NA,Area Studies,NA,ASSOC ADVANCEMENT BALTIC STUDIES INC,NA +journal of band research,0021-9207,NA,NA,1,0,0,0,NA,NA,Music,TROY STATE UNIV PRESS,NA +journal of banking & finance,0378-4266,1872-6372,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +journal of basic microbiology,0233-111X,1521-4028,NA,0,0,1,0,Microbiology,NA,NA,WILEY,NA +journal of beckett studies,0309-5207,1759-7811,NA,1,0,0,0,NA,NA,"Literary Theory & Criticism | Theater | Literature, British Isles",EDINBURGH UNIV PRESS,NA +journal of behavior therapy and experimental psychiatry,0005-7916,1873-7943,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of behavioral addictions,2062-5871,2063-5303,NA,0,1,1,0,Psychiatry,Psychiatry,NA,AKADEMIAI KIADO ZRT,NA +journal of behavioral addictions,2062-5871,2063-5303,NA,0,1,1,0,Psychiatry,Psychiatry,NA,AKADEMIAI KIADO ZRT,NA +journal of behavioral and experimental economics,2214-8043,2214-8051,NA,0,1,0,0,NA,Economics,NA,ELSEVIER SCIENCE INC,NA +journal of behavioral and experimental finance,2214-6350,2214-6369,JournalofBehav1,0,1,0,1,NA,"Business, Finance | Economics",NA,ELSEVIER,2020-10-29 +journal of behavioral decision making,0894-3257,1099-0771,NA,0,1,0,0,NA,"Psychology, Applied",NA,WILEY,NA +journal of behavioral education,1053-0819,1573-3513,NA,0,1,0,0,NA,"Education, Special",NA,SPRINGER,NA +journal of behavioral finance,1542-7560,1542-7579,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of behavioral health services & research,1094-3412,1556-3308,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,SPRINGER,NA +journal of behavioral health services & research,1094-3412,1556-3308,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,SPRINGER,NA +journal of behavioral medicine,0160-7715,1573-3521,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of belgian history-revue belge d histoire contemporaine-belgisch tijdschrift voor nieuwste geschiedenis,0035-0869,NA,NA,1,0,0,0,NA,NA,History,SOMA-CEGES,NA +journal of beliefs & values-studies in religion & education,1361-7672,1469-9362,NA,1,1,0,0,NA,Education & Educational Research,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of beliefs & values-studies in religion & education,1361-7672,1469-9362,NA,1,1,0,0,NA,Education & Educational Research,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of benefit-cost analysis,2194-5888,2152-2812,NA,0,1,0,0,NA,Economics,NA,CAMBRIDGE UNIV PRESS,NA +journal of berry research,1878-5093,1878-5123,BerryResearch,0,0,1,1,Plant Sciences,NA,NA,IOS PRESS,2019-04-26 +journal of biblical literature,0021-9231,1934-3876,NA,1,0,0,0,NA,NA,Religion,SOC BIBLICAL LITERATURE,NA +journal of bioactive and compatible polymers,0883-9115,1530-8030,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Materials Science, Biomaterials | Polymer Science",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of biobased materials and bioenergy,1556-6560,1556-6579,NA,0,0,1,0,"Chemistry, Applied | Energy & Fuels | Materials Science, Biomaterials",NA,NA,AMER SCIENTIFIC PUBLISHERS,NA +journal of biochemical and molecular toxicology,1095-6670,1099-0461,NA,0,0,1,0,Biochemistry & Molecular Biology | Toxicology,NA,NA,WILEY,NA +journal of biochemistry,0021-924X,1756-2651,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,OXFORD UNIV PRESS,NA +journal of bioenergetics and biomembranes,0145-479X,1573-6881,NA,0,0,1,0,Biophysics | Cell Biology,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of bioethical inquiry,1176-7529,1872-4353,bioethicinquiry,0,1,1,1,Medical Ethics,"Ethics | Social Issues | Social Sciences, Biomedical",NA,SPRINGER,2016-08-17 +journal of bioethical inquiry,1176-7529,1872-4353,bioethicinquiry,0,1,1,1,Medical Ethics,"Ethics | Social Issues | Social Sciences, Biomedical",NA,SPRINGER,2016-08-17 +journal of biogeography,0305-0270,1365-2699,JBiogeography,0,0,1,1,"Ecology | Geography, Physical",NA,NA,WILEY,2016-08-06 +journal of bioinformatics and computational biology,0219-7200,1757-6334,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of biological chemistry,0021-9258,1083-351X,jbiolchem,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,ELSEVIER,2012-03-23 +journal of biological dynamics,1751-3758,1751-3766,JBioDynamics,0,0,1,1,Ecology | Mathematical & Computational Biology,NA,NA,TAYLOR & FRANCIS LTD,2018-08-29 +journal of biological education,0021-9266,2157-6009,NA,0,1,1,0,"Biology | Education, Scientific Disciplines",Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of biological education,0021-9266,2157-6009,NA,0,1,1,0,"Biology | Education, Scientific Disciplines",Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of biological engineering,1754-1611,1754-1611,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology,NA,NA,BMC,NA +journal of biological inorganic chemistry,0949-8257,1432-1327,JBIC_Journal,0,0,1,1,"Biochemistry & Molecular Biology | Chemistry, Inorganic & Nuclear",NA,NA,SPRINGER,2020-01-16 +journal of biological physics,0092-0606,1573-0689,NA,0,0,1,0,Biophysics,NA,NA,SPRINGER,NA +journal of biological regulators and homeostatic agents,0393-974X,1724-6083,NA,0,0,1,0,"Endocrinology & Metabolism | Immunology | Medicine, Research & Experimental | Physiology",NA,NA,BIOLIFE SAS,NA +journal of biological research-thessaloniki,1790-045X,2241-5793,NA,0,0,1,0,Biology,NA,NA,BMC,NA +journal of biological rhythms,0748-7304,1552-4531,NA,0,0,1,0,Biology | Physiology,NA,NA,SAGE PUBLICATIONS INC,NA +journal of biological systems,0218-3390,1793-6470,NA,0,0,1,0,Biology | Mathematical & Computational Biology,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of biomaterials and tissue engineering,2157-9083,2157-9091,NA,0,0,1,0,Cell & Tissue Engineering,NA,NA,AMER SCIENTIFIC PUBLISHERS,NA +journal of biomaterials applications,0885-3282,1530-8022,J_Biomater_App,0,0,1,1,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,SAGE PUBLICATIONS LTD,2013-10-16 +journal of biomaterials science-polymer edition,0920-5063,1568-5624,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials | Polymer Science",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of biomechanical engineering-transactions of the asme,0148-0731,1528-8951,NA,0,0,1,0,"Biophysics | Engineering, Biomedical",NA,NA,ASME,NA +journal of biomechanics,0021-9290,1873-2380,JBiomech,0,0,1,1,"Biophysics | Engineering, Biomedical",NA,NA,ELSEVIER SCI LTD,2016-05-23 +journal of biomedical informatics,1532-0464,1532-0480,JBI_Journal,0,0,1,1,"Computer Science, Interdisciplinary Applications | Medical Informatics",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2021-10-14 +journal of biomedical materials research part a,1549-3296,1552-4965,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,WILEY,NA +journal of biomedical materials research part b-applied biomaterials,1552-4973,1552-4981,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,WILEY,NA +journal of biomedical nanotechnology,1550-7033,1550-7041,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Biomaterials",NA,NA,AMER SCIENTIFIC PUBLISHERS,NA +journal of biomedical optics,1083-3668,1560-2281,NA,0,0,1,0,"Biochemical Research Methods | Optics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +journal of biomedical science,1021-7770,1423-0127,NA,0,0,1,0,"Cell Biology | Medicine, Research & Experimental",NA,NA,BMC,NA +journal of biomedical semantics,2041-1480,2041-1480,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,BMC,NA +journal of biomolecular nmr,0925-2738,1573-5001,NA,0,0,1,0,Biochemistry & Molecular Biology | Spectroscopy,NA,NA,SPRINGER,NA +journal of biomolecular structure & dynamics,0739-1102,1538-0254,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,TAYLOR & FRANCIS INC,NA +journal of bionic engineering,1672-6529,2543-2141,NA,0,0,1,0,"Engineering, Multidisciplinary | Materials Science, Biomaterials | Robotics",NA,NA,SPRINGER SINGAPORE PTE LTD,NA +journal of biopharmaceutical statistics,1054-3406,1520-5711,JBiopharmaStats,0,0,1,1,Pharmacology & Pharmacy | Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,2019-12-18 +journal of biophotonics,1864-063X,1864-0648,NA,0,0,1,0,Biochemical Research Methods | Biophysics | Optics,NA,NA,WILEY-V C H VERLAG GMBH,NA +journal of bioscience and bioengineering,1389-1723,1347-4421,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology,NA,NA,SOC BIOSCIENCE BIOENGINEERING JAPAN,NA +journal of biosciences,0250-5991,0973-7138,BiosciencesOf,0,0,1,1,Biology,NA,NA,INDIAN ACAD SCIENCES,2019-08-22 +journal of biosocial science,0021-9320,1469-7599,NA,0,1,0,0,NA,"Demography | Social Sciences, Biomedical",NA,CAMBRIDGE UNIV PRESS,NA +journal of biotechnology,0168-1656,1873-4863,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,ELSEVIER,NA +journal of black psychology,0095-7984,1552-4558,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +journal of black studies,0021-9347,1552-4566,NA,0,1,0,0,NA,"Ethnic Studies | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +journal of bone and joint surgery-american volume,0021-9355,1535-1386,jbjs,0,0,1,1,Orthopedics | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2009-03-09 +journal of bone and mineral metabolism,0914-8779,1435-5604,NA,0,0,1,0,"Endocrinology & Metabolism | Medicine, Research & Experimental",NA,NA,SPRINGER JAPAN KK,NA +journal of bone and mineral research,0884-0431,1523-4681,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,WILEY,NA +journal of bone oncology,2212-1374,2212-1374,NA,0,0,1,0,Oncology,NA,NA,ELSEVIER,NA +journal of brand management,1350-231X,1479-1803,JofbrandM,0,1,0,1,NA,Business | Management,NA,PALGRAVE MACMILLAN LTD,2020-03-30 +journal of breast cancer,1738-6756,2092-9900,NA,0,0,1,0,Oncology,NA,NA,KOREAN BREAST CANCER SOC,NA +journal of breath research,1752-7155,1752-7163,NA,0,0,1,0,Biochemical Research Methods | Respiratory System,NA,NA,IOP PUBLISHING LTD,NA +journal of bridge engineering,1084-0702,1943-5592,ASCE_JBE,0,0,1,1,"Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,2019-09-20 +journal of british cinema and television,1743-4521,1755-1714,NA,1,0,0,0,NA,NA,"Film, Radio, Television",EDINBURGH UNIV PRESS,NA +journal of british studies,0021-9371,1545-6986,jbritishstudies,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2019-03-27 +journal of british studies,0021-9371,1545-6986,jbritishstudies,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2019-03-27 +journal of broadcasting & electronic media,0883-8151,1550-6878,NA,0,1,0,0,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of bryology,0373-6687,1743-2820,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of building engineering,2352-7102,2352-7102,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,ELSEVIER,NA +journal of building performance simulation,1940-1493,1940-1507,NA,0,0,1,0,Construction & Building Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of building physics,1744-2591,1744-2583,NA,0,0,1,0,Construction & Building Technology,NA,NA,SAGE PUBLICATIONS LTD,NA +journal of buon,1107-0625,2241-6293,NA,0,0,1,0,Oncology,NA,NA,IMPRIMATUR PUBLICATIONS,NA +journal of burn care & research,1559-047X,1559-0488,NA,0,0,1,0,Critical Care Medicine | Dermatology | Surgery,NA,NA,OXFORD UNIV PRESS,NA +journal of business-to-business marketing,1051-712X,1547-0628,NA,0,1,0,0,NA,Business,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of business & economic statistics,0735-0015,1537-2707,NA,0,1,1,0,Statistics & Probability,"Economics | Social Sciences, Mathematical Methods",NA,TAYLOR & FRANCIS INC,NA +journal of business & economic statistics,0735-0015,1537-2707,NA,0,1,1,0,Statistics & Probability,"Economics | Social Sciences, Mathematical Methods",NA,TAYLOR & FRANCIS INC,NA +journal of business & industrial marketing,0885-8624,2052-1189,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of business and psychology,0889-3268,1573-353X,NA,0,1,0,0,NA,"Business | Psychology, Applied",NA,SPRINGER,NA +journal of business and technical communication,1050-6519,1552-4574,journalofbusin1,0,1,0,1,NA,Business | Communication,NA,SAGE PUBLICATIONS INC,2019-02-14 +journal of business economics and management,1611-1699,2029-4433,NA,0,1,0,0,NA,Business | Economics,NA,VILNIUS GEDIMINAS TECH UNIV,NA +journal of business ethics,0167-4544,1573-0697,JBusinessEthics,0,1,0,1,NA,Business | Ethics,NA,SPRINGER,2016-09-14 +journal of business finance & accounting,0306-686X,1468-5957,JBusFinAcc,0,1,0,1,NA,"Business, Finance",NA,WILEY,2019-04-11 +journal of business logistics,0735-3766,2158-1592,JBizLogistics,0,1,0,1,NA,Management,NA,WILEY,2020-10-02 +journal of business research,0148-2963,1873-7978,NA,0,1,0,0,NA,Business,NA,ELSEVIER SCIENCE INC,NA +journal of business venturing,0883-9026,1873-2003,JnlBusVenturing,0,1,0,1,NA,Business,NA,ELSEVIER,2017-06-15 +journal of cachexia sarcopenia and muscle,2190-5991,2190-6009,JCSM_cachexia,0,0,1,1,"Geriatrics & Gerontology | Medicine, General & Internal",NA,NA,WILEY,2020-12-19 +journal of canadian studies-revue d etudes canadiennes,0021-9495,1911-0251,JCS_REC,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",UNIV TORONTO PRESS INC,2012-05-24 +journal of cancer,1837-9664,1837-9664,NA,0,0,1,0,Oncology,NA,NA,IVYSPRING INT PUBL,NA +journal of cancer education,0885-8195,1543-0154,NA,0,0,1,0,"Oncology | Education, Scientific Disciplines | Public, Environmental & Occupational Health",NA,NA,SPRINGER,NA +journal of cancer research and clinical oncology,0171-5216,1432-1335,NA,0,0,1,0,Oncology,NA,NA,SPRINGER,NA +journal of cancer research and therapeutics,0973-1482,1998-4138,NA,0,0,1,0,Oncology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +journal of cancer survivorship,1932-2259,1932-2267,jcansurv,0,1,1,1,Oncology,"Social Sciences, Biomedical",NA,SPRINGER,2020-01-04 +journal of cancer survivorship,1932-2259,1932-2267,jcansurv,0,1,1,1,Oncology,"Social Sciences, Biomedical",NA,SPRINGER,2020-01-04 +journal of carbohydrate chemistry,0732-8303,1532-2327,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Organic",NA,NA,TAYLOR & FRANCIS INC,NA +journal of cardiac failure,1071-9164,1532-8414,JCardFail,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,CHURCHILL LIVINGSTONE INC MEDICAL PUBLISHERS,2013-08-26 +journal of cardiac surgery,0886-0440,1540-8191,JCardSurg,0,0,1,1,Cardiac & Cardiovascular System | Surgery,NA,NA,WILEY,2020-12-01 +journal of cardiology,0914-5087,1876-4738,J_Cardiol,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,ELSEVIER,2021-04-06 +journal of cardiopulmonary rehabilitation and prevention,1932-7501,1932-751X,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of cardiothoracic and vascular anesthesia,1053-0770,1532-8422,JCVAonline,0,0,1,1,Anesthesiology | Cardiac & Cardiovascular System | Respiratory System | Peripheral Vascular Diseases,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2018-09-06 +journal of cardiothoracic surgery,1749-8090,1749-8090,JournalCTSurg,0,0,1,1,Cardiac & Cardiovascular System | Surgery,NA,NA,BMC,2018-04-02 +journal of cardiovascular computed tomography,1934-5925,1934-5925,journalCCT,0,0,1,1,"Cardiac & Cardiovascular System | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,2018-03-13 +journal of cardiovascular development and disease,2308-3425,2308-3425,JCDD_MDPI,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,MDPI,2015-09-18 +journal of cardiovascular electrophysiology,1045-3873,1540-8167,JCardioEP,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,WILEY,2018-09-28 +journal of cardiovascular magnetic resonance,1097-6647,1532-429X,journalofCMR,0,0,1,1,"Cardiac & Cardiovascular System | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,BMC,2014-03-13 +journal of cardiovascular medicine,1558-2027,1558-2035,JCardioMedicine,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-12-15 +journal of cardiovascular nursing,0889-4655,1550-5049,JCNonline,0,1,1,1,Cardiac & Cardiovascular System | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-03 +journal of cardiovascular nursing,0889-4655,1550-5049,JCNonline,0,1,1,1,Cardiac & Cardiovascular System | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-03 +journal of cardiovascular pharmacology,0160-2446,1533-4023,JCVPOnline,0,0,1,1,Cardiac & Cardiovascular System | Pharmacology & Pharmacy,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2018-10-24 +journal of cardiovascular pharmacology and therapeutics,1074-2484,1940-4034,NA,0,0,1,0,Cardiac & Cardiovascular System | Pharmacology & Pharmacy,NA,NA,SAGE PUBLICATIONS INC,NA +journal of cardiovascular surgery,0021-9509,1827-191X,NA,0,0,1,0,Cardiac & Cardiovascular System | Surgery | Peripheral Vascular Diseases,NA,NA,EDIZIONI MINERVA MEDICA,NA +journal of cardiovascular translational research,1937-5387,1937-5395,NA,0,0,1,0,"Cardiac & Cardiovascular System | Medicine, Research & Experimental",NA,NA,SPRINGER,NA +journal of career assessment,1069-0727,1552-4590,NA,0,1,0,0,NA,"Psychology, Applied",NA,SAGE PUBLICATIONS INC,NA +journal of career development,0894-8453,1556-0856,NA,0,1,0,0,NA,"Psychology, Applied",NA,SAGE PUBLICATIONS INC,NA +journal of catalysis,0021-9517,1090-2694,NA,0,0,1,0,"Chemistry, Physical | Engineering, Chemical",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of cataract and refractive surgery,0886-3350,1873-4502,jcrsjournal,0,0,1,1,Ophthalmology | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2017-07-22 +journal of causal inference,2193-3677,2193-3685,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods",NA,WALTER DE GRUYTER GMBH,NA +journal of causal inference,2193-3677,2193-3685,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods",NA,WALTER DE GRUYTER GMBH,NA +journal of cave and karst studies,1090-6924,2331-3714,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,"NATL SPELEOLOGICAL SOC",NA +journal of cell biology,0021-9525,1540-8140,JCellBiol,0,0,1,1,Cell Biology,NA,NA,ROCKEFELLER UNIV PRESS,2009-09-18 +journal of cell communication and signaling,1873-9601,1873-961X,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGER,NA +journal of cell science,0021-9533,1477-9137,J_Cell_Sci,0,0,1,1,Cell Biology,NA,NA,COMPANY BIOLOGISTS LTD,2011-11-29 +journal of cellular and molecular medicine,1582-1838,1582-4934,NA,0,0,1,0,"Cell Biology | Medicine, Research & Experimental",NA,NA,WILEY,NA +journal of cellular automata,1557-5969,1557-5977,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Interdisciplinary Applications",NA,NA,OLD CITY PUBLISHING INC,NA +journal of cellular biochemistry,0730-2312,1097-4644,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,WILEY,NA +journal of cellular physiology,0021-9541,1097-4652,NA,0,0,1,0,Cell Biology | Physiology,NA,NA,WILEY,NA +journal of cellular plastics,0021-955X,1530-7999,NA,0,0,1,0,"Chemistry, Applied | Polymer Science",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of central south university,2095-2899,2227-5223,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,JOURNAL OF CENTRAL SOUTH UNIV,NA +journal of ceramic processing research,1229-9162,1229-9162,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,"KOREAN ASSOC CRYSTAL GROWTH, INC",NA +journal of ceramic science and technology,2190-9385,2190-9385,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,GOLLER VERLAG GMBH,NA +journal of cereal science,0733-5210,1095-9963,NA,0,0,1,0,Food Science & Technology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of cerebral blood flow and metabolism,0271-678X,1559-7016,NA,0,0,1,0,Endocrinology & Metabolism | Hematology | Neurosciences,NA,NA,SAGE PUBLICATIONS INC,NA +journal of chemical and engineering data,0021-9568,1520-5134,NA,0,0,1,0,"Thermodynamics | Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,AMER CHEMICAL SOC,NA +journal of chemical crystallography,1074-1542,1572-8854,NA,0,0,1,0,Crystallography | Spectroscopy,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of chemical ecology,0098-0331,1573-1561,NA,0,0,1,0,Biochemistry & Molecular Biology | Ecology,NA,NA,SPRINGER,NA +journal of chemical education,0021-9584,1938-1328,NA,0,0,1,0,"Chemistry, Multidisciplinary | Education, Scientific Disciplines",NA,NA,AMER CHEMICAL SOC,NA +journal of chemical engineering of japan,0021-9592,0021-9592,NA,0,0,1,0,"Engineering, Chemical",NA,NA,SOC CHEMICAL ENG JAPAN,NA +journal of chemical information and modeling,1549-9596,1549-960X,JCIM_ACS,0,0,1,1,"Chemistry, Medicinal | Chemistry, Multidisciplinary | Computer Science, Information Systems | Computer Science, Interdisciplinary Applications",NA,NA,AMER CHEMICAL SOC,NA +journal of chemical neuroanatomy,0891-0618,1873-6300,NA,0,0,1,0,Biochemistry & Molecular Biology | Neurosciences,NA,NA,ELSEVIER,NA +journal of chemical physics,0021-9606,1089-7690,JChemPhys,0,0,1,1,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,AIP PUBLISHING,2022-03-09 +journal of chemical research,1747-5198,2047-6507,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of chemical sciences,0974-3626,0973-7103,JChemSci,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,INDIAN ACAD SCIENCES,2018-06-27 +journal of chemical technology and biotechnology,0268-2575,1097-4660,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Chemistry, Multidisciplinary | Engineering, Environmental | Engineering, Chemical",NA,NA,WILEY,NA +journal of chemical theory and computation,1549-9618,1549-9626,jctc_papers,0,0,1,1,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,AMER CHEMICAL SOC,2014-04-21 +journal of chemical thermodynamics,0021-9614,1096-3626,NA,0,0,1,0,"Thermodynamics | Chemistry, Physical",NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of cheminformatics,1758-2946,1758-2946,jcheminf,0,0,1,1,"Chemistry, Multidisciplinary | Computer Science, Information Systems | Computer Science, Interdisciplinary Applications",NA,NA,BMC,2016-08-11 +journal of chemistry,2090-9063,2090-9071,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,HINDAWI LTD,NA +journal of chemometrics,0886-9383,1099-128X,NA,0,0,1,0,"Automation & Control Systems | Chemistry, Analytical | Computer Science, Artificial Intelligence | Instruments & Instrumentation | Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,WILEY,NA +journal of chemotherapy,1120-009X,1973-9478,NA,0,0,1,0,Oncology | Infectious Diseases | Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of child & adolescent substance abuse,1067-828X,1547-0652,NA,0,1,0,0,NA,Substance Abuse,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of child and adolescent psychopharmacology,1044-5463,1557-8992,NA,0,0,1,0,Pediatrics | Pharmacology & Pharmacy | Psychiatry,NA,NA,"MARY ANN LIEBERT, INC",NA +journal of child and family studies,1062-1024,1573-2843,NA,0,1,0,0,NA,"Family Studies | Psychology, Development | Psychiatry",NA,SPRINGER,NA +journal of child health care,1367-4935,1741-2889,JournalofCHC,0,1,1,1,Nursing | Pediatrics,Nursing,NA,SAGE PUBLICATIONS LTD,2013-11-07 +journal of child health care,1367-4935,1741-2889,JournalofCHC,0,1,1,1,Nursing | Pediatrics,Nursing,NA,SAGE PUBLICATIONS LTD,2013-11-07 +journal of child language,0305-0009,1469-7602,NA,0,1,0,0,NA,"Psychology, Development | Linguistics | Psychology, Experimental",NA,CAMBRIDGE UNIV PRESS,NA +journal of child neurology,0883-0738,1708-8283,NA,0,0,1,0,Clinical Neurology | Pediatrics,NA,NA,SAGE PUBLICATIONS INC,NA +journal of child psychology and psychiatry,0021-9630,1469-7610,TheJCPP,0,1,1,1,Psychiatry | Psychology,"Psychiatry | Psychology, Development",NA,WILEY,2017-03-23 +journal of child psychology and psychiatry,0021-9630,1469-7610,TheJCPP,0,1,1,1,Psychiatry | Psychology,"Psychiatry | Psychology, Development",NA,WILEY,2017-03-23 +journal of child sexual abuse,1053-8712,1547-0679,NA,0,1,0,0,NA,"Psychology, Clinical | Family Studies",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of children and media,1748-2798,1748-2801,jocam_online,0,1,0,1,NA,"Communication | Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-01-20 +journal of childrens orthopaedics,1863-2521,1863-2548,NA,0,0,1,0,Orthopedics | Pediatrics,NA,NA,BRITISH EDITORIAL SOC BONE & JOINT SURGERY,NA +journal of chinese cinemas,1750-8061,1750-807X,NA,1,0,0,0,NA,NA,"Film, Radio, Television","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of chinese governance,2381-2346,2381-2354,jcg_journal,0,1,0,1,NA,Political Science | Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-09-15 +journal of chinese linguistics,0091-3723,0091-3723,NA,1,1,0,0,NA,Linguistics,Language & Linguistics | Asian Studies,JOURNAL CHINESE LINGUISTICS,NA +journal of chinese linguistics,0091-3723,0091-3723,NA,1,1,0,0,NA,Linguistics,Language & Linguistics | Asian Studies,JOURNAL CHINESE LINGUISTICS,NA +journal of chinese literature and culture,2329-0048,2329-0056,NA,1,0,0,0,NA,NA,Literature | Asian Studies,DUKE UNIV PRESS,NA +journal of chinese philosophy,0301-8121,1540-6253,NA,1,0,0,0,NA,NA,Philosophy | Asian Studies,BRILL,NA +journal of chinese political science,1080-6954,1874-6357,jcpsjournal,0,1,0,1,NA,Area Studies | Political Science,NA,SPRINGER,2022-02-21 +journal of choice modelling,1755-5345,1755-5345,NA,0,1,0,0,NA,Economics,NA,ELSEVIER SCI LTD,NA +journal of chromatographic science,0021-9665,1945-239X,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,OXFORD UNIV PRESS INC,NA +journal of chromatography a,0021-9673,1873-3778,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,ELSEVIER,NA +journal of chromatography b-analytical technologies in the biomedical and life sciences,1570-0232,1873-376X,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,ELSEVIER,NA +journal of church and state,0021-969X,2040-4867,NA,1,0,0,0,NA,NA,Religion,OXFORD UNIV PRESS,NA +journal of circuits systems and computers,0218-1266,1793-6454,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Engineering, Electrical & Electronic",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of civil engineering and management,1392-3730,1822-3605,NA,0,0,1,0,"Engineering, Civil",NA,NA,VILNIUS GEDIMINAS TECH UNIV,NA +journal of civil engineering education,2643-9107,2643-9115,ASCE_JCEE,0,0,1,1,"Education, Scientific Disciplines | Engineering, Multidisciplinary",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,2021-02-24 +journal of civil structural health monitoring,2190-5452,2190-5479,NA,0,0,1,0,"Engineering, Civil",NA,NA,SPRINGER HEIDELBERG,NA +journal of classification,0176-4268,1432-1343,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Psychology, Mathematical",NA,SPRINGER,NA +journal of classification,0176-4268,1432-1343,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Psychology, Mathematical",NA,SPRINGER,NA +journal of cleaner production,0959-6526,1879-1786,NA,0,0,1,0,"Green & Sustainable Science & Technology | Engineering, Environmental | Environmental Sciences",NA,NA,ELSEVIER SCI LTD,NA +journal of climate,0894-8755,1520-0442,AMSJCLi,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,AMER METEOROLOGICAL SOC,2019-05-16 +journal of clinical and experimental neuropsychology,1380-3395,1744-411X,NA,0,1,1,0,Clinical Neurology | Psychology,"Psychology, Clinical",NA,TAYLOR & FRANCIS INC,NA +journal of clinical and experimental neuropsychology,1380-3395,1744-411X,NA,0,1,1,0,Clinical Neurology | Psychology,"Psychology, Clinical",NA,TAYLOR & FRANCIS INC,NA +journal of clinical and translational hepatology,2225-0719,2310-8819,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,XIA & HE PUBLISHING INC,NA +journal of clinical anesthesia,0952-8180,1873-4529,JournalofClinAn,0,0,1,1,Anesthesiology,NA,NA,ELSEVIER SCIENCE INC,2021-02-03 +journal of clinical apheresis,0733-2459,1098-1101,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +journal of clinical biochemistry and nutrition,0912-0009,1880-5086,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,JOURNAL CLINICAL BIOCHEMISTRY & NUTRITION,NA +journal of clinical child and adolescent psychology,1537-4416,1537-4424,NA,0,1,0,0,NA,"Psychology, Clinical | Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of clinical densitometry,1094-6950,1559-0747,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ELSEVIER SCIENCE INC,NA +journal of clinical endocrinology & metabolism,0021-972X,1945-7197,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ENDOCRINE SOC,NA +journal of clinical epidemiology,0895-4356,1878-5921,JClinEpi,0,0,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health",NA,NA,ELSEVIER SCIENCE INC,2014-12-09 +journal of clinical gastroenterology,0192-0790,1539-2031,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of clinical hypertension,1524-6175,1751-7176,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,WILEY,NA +journal of clinical immunology,0271-9142,1573-2592,NA,0,0,1,0,Immunology,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of clinical investigation,0021-9738,1558-8238,jclinicalinvest,0,0,1,1,"Medicine, Research & Experimental",NA,NA,AMER SOC CLINICAL INVESTIGATION INC,2010-12-06 +journal of clinical laboratory analysis,0887-8013,1098-2825,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,WILEY,NA +journal of clinical lipidology,1933-2874,1876-4789,LipidJournal,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ELSEVIER SCIENCE INC,2017-05-15 +journal of clinical medicine,2077-0383,2077-0383,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MDPI,NA +journal of clinical microbiology,0095-1137,1098-660X,JClinMicro,0,0,1,1,Microbiology,NA,NA,AMER SOC MICROBIOLOGY,2015-12-28 +journal of clinical monitoring and computing,1387-1307,1573-2614,NA,0,0,1,0,Anesthesiology,NA,NA,SPRINGER HEIDELBERG,NA +journal of clinical neurology,1738-6586,2005-5013,NA,0,0,1,0,Clinical Neurology,NA,NA,KOREAN NEUROLOGICAL ASSOC,NA +journal of clinical neurophysiology,0736-0258,1537-1603,JClinNeurophys,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2014-04-25 +journal of clinical neuroscience,0967-5868,1532-2653,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,ELSEVIER SCI LTD,NA +journal of clinical nursing,0962-1067,1365-2702,jclinnursing,0,1,1,1,Nursing,Nursing,NA,WILEY,2010-12-11 +journal of clinical nursing,0962-1067,1365-2702,jclinnursing,0,1,1,1,Nursing,Nursing,NA,WILEY,2010-12-11 +journal of clinical oncology,0732-183X,1527-7755,JCO_ASCO,0,0,1,1,Oncology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2014-03-18 +journal of clinical pathology,0021-9746,1472-4146,JClinPath_BMJ,0,0,1,1,Pathology,NA,NA,BMJ PUBLISHING GROUP,2010-05-12 +journal of clinical pediatric dentistry,1053-4628,1557-5268,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Pediatrics",NA,NA,JOURNAL PEDODONTICS INC,NA +journal of clinical periodontology,0303-6979,1600-051X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +journal of clinical pharmacology,0091-2700,1552-4604,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,WILEY,NA +journal of clinical pharmacy and therapeutics,0269-4727,1365-2710,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,WILEY,NA +journal of clinical psychiatry,0160-6689,1555-2101,NA,0,1,1,0,Psychiatry,"Psychiatry | Psychology, Clinical",NA,PHYSICIANS POSTGRADUATE PRESS,NA +journal of clinical psychiatry,0160-6689,1555-2101,NA,0,1,1,0,Psychiatry,"Psychiatry | Psychology, Clinical",NA,PHYSICIANS POSTGRADUATE PRESS,NA +journal of clinical psychology,0021-9762,1097-4679,NA,0,1,0,0,NA,"Psychology, Clinical",NA,WILEY,NA +journal of clinical psychology in medical settings,1068-9583,1573-3572,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of clinical psychopharmacology,0271-0749,1533-712X,JCPjournal,0,0,1,1,Pharmacology & Pharmacy | Psychiatry,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-01-14 +journal of clinical research in pediatric endocrinology,1308-5727,1308-5735,NA,0,0,1,0,Endocrinology & Metabolism | Pediatrics,NA,NA,GALENOS YAYINCILIK,NA +journal of clinical sleep medicine,1550-9389,1550-9397,JCSMJournal,0,0,1,1,Clinical Neurology,NA,NA,AMER ACAD SLEEP MEDICINE,2015-01-06 +journal of clinical sport psychology,1932-9261,1932-927X,NA,0,1,0,0,NA,"Psychology, Applied",NA,HUMAN KINETICS PUBL INC,NA +journal of clinical ultrasound,0091-2751,1097-0096,NA,0,0,1,0,"Acoustics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,NA +journal of clinical virology,1386-6532,1873-5967,NA,0,0,1,0,Virology,NA,NA,ELSEVIER,NA +journal of cloud computing-advances systems and applications,2192-113X,2192-113X,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,SPRINGER,NA +journal of cluster science,1040-7278,1572-8862,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of co2 utilization,2212-9820,2212-9839,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +journal of coastal conservation,1400-0350,1874-7841,NA,0,0,1,0,Environmental Sciences | Marine & Freshwater Biology,NA,NA,SPRINGER,NA +journal of coastal research,0749-0208,1551-5036,NA,0,0,1,0,"Environmental Sciences | Geography, Physical | Geosciences, Multidisciplinary",NA,NA,COASTAL EDUCATION & RESEARCH FOUNDATION,NA +journal of coatings technology and research,1547-0091,1935-3804,NA,0,0,1,0,"Chemistry, Applied | Materials Science, Coatings & Films",NA,NA,SPRINGER,NA +journal of cognition and development,1524-8372,1532-7647,NA,0,1,0,0,NA,"Psychology, Development | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of cognitive neuroscience,0898-929X,1530-8898,NA,0,1,1,0,Neurosciences,"Psychology, Experimental",NA,MIT PRESS,NA +journal of cognitive neuroscience,0898-929X,1530-8898,NA,0,1,1,0,Neurosciences,"Psychology, Experimental",NA,MIT PRESS,NA +journal of cognitive psychology,2044-5911,2044-592X,NA,0,1,0,0,NA,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of cognitive psychotherapy,0889-8391,1938-887X,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER PUBLISHING CO,NA +journal of cold regions engineering,0887-381X,1943-5495,NA,0,0,1,0,"Engineering, Environmental | Engineering, Civil | Geosciences, Multidisciplinary",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of cold war studies,1520-3972,1531-3298,NA,1,1,0,0,NA,History | International Relations | Political Science,History,MIT PRESS,NA +journal of cold war studies,1520-3972,1531-3298,NA,1,1,0,0,NA,History | International Relations | Political Science,History,MIT PRESS,NA +journal of college student development,0897-5264,1543-3382,ACPAJCSD,0,1,0,1,NA,"Education & Educational Research | Psychology, Applied",NA,JOHNS HOPKINS UNIV PRESS,2015-11-07 +journal of colloid and interface science,0021-9797,1095-7103,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of combinatorial algebra,2415-6302,2415-6310,NA,0,0,1,0,Mathematics,NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +journal of combinatorial designs,1063-8539,1520-6610,NA,0,0,1,0,Mathematics,NA,NA,WILEY,NA +journal of combinatorial optimization,1382-6905,1573-2886,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Mathematics, Applied",NA,NA,SPRINGER,NA +journal of combinatorial theory series a,0097-3165,1096-0899,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of combinatorial theory series b,0095-8956,1096-0902,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of commodity markets,2405-8513,2405-8505,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +journal of commonwealth literature,0021-9894,1741-6442,JCLJournal,1,0,0,1,NA,NA,"Literature, African, Australian, Canadian",SAGE PUBLICATIONS LTD,2010-07-29 +journal of communication,0021-9916,1460-2466,journal_of_comm,0,1,0,1,NA,Communication,NA,OXFORD UNIV PRESS INC,2020-09-24 +journal of communication disorders,0021-9924,1873-7994,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,ELSEVIER SCIENCE INC,NA +journal of communication disorders,0021-9924,1873-7994,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,ELSEVIER SCIENCE INC,NA +journal of communications and networks,1229-2370,1976-5541,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,KOREAN INST COMMUNICATIONS SCIENCES (K I C S),NA +journal of communications technology and electronics,1064-2269,1555-6557,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,PLEIADES PUBLISHING INC,NA +journal of community & applied social psychology,1052-9284,1099-1298,NA,0,1,0,0,NA,"Psychology, Social",NA,WILEY,NA +journal of community health,0094-5145,1573-3610,NA,0,1,0,0,NA,"Health Policy & Services | Public, Environmental & Occupational Health",NA,SPRINGER,NA +journal of community health nursing,0737-0016,1532-7655,NA,0,1,1,0,Nursing,Nursing,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of community health nursing,0737-0016,1532-7655,NA,0,1,1,0,Nursing,Nursing,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of community psychology,0090-4392,1520-6629,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Psychology, Multidisciplinary | Social Work",NA,WILEY,NA +journal of commutative algebra,1939-0807,1939-2346,NA,0,0,1,0,Mathematics,NA,NA,ROCKY MT MATH CONSORTIUM,NA +journal of comparative economics,0147-5967,1095-7227,NA,0,1,0,0,NA,Economics,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of comparative effectiveness research,2042-6305,2042-6313,fsgcer,0,0,1,1,Health Care Sciences & Services,NA,NA,FUTURE MEDICINE LTD,2014-07-22 +journal of comparative family studies,0047-2328,1929-9850,NA,0,1,0,0,NA,Family Studies,NA,UNIV TORONTO PRESS INC,NA +journal of comparative germanic linguistics,1383-4924,1572-8552,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SPRINGER,NA +journal of comparative germanic linguistics,1383-4924,1572-8552,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SPRINGER,NA +journal of comparative neurology,0021-9967,1096-9861,NA,0,0,1,0,Neurosciences | Zoology,NA,NA,WILEY,NA +journal of comparative pathology,0021-9975,1532-3129,JournalCompPath,0,0,1,1,Pathology | Veterinary Sciences,NA,NA,ELSEVIER SCI LTD,2020-05-16 +journal of comparative physiology a-neuroethology sensory neural and behavioral physiology,0340-7594,1432-1351,NA,0,0,1,0,Behavioral Sciences | Neurosciences | Physiology | Zoology,NA,NA,SPRINGER HEIDELBERG,NA +journal of comparative physiology b-biochemical systems and environmental physiology,0174-1578,1432-136X,NA,0,0,1,0,Physiology | Zoology,NA,NA,SPRINGER HEIDELBERG,NA +journal of comparative policy analysis,1387-6988,1572-5448,JCPA_ICPA,0,1,0,1,NA,Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-09-13 +journal of comparative psychology,0735-7036,1939-2087,NA,0,1,1,0,Behavioral Sciences | Psychology | Zoology,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of comparative psychology,0735-7036,1939-2087,NA,0,1,1,0,Behavioral Sciences | Psychology | Zoology,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of competition law & economics,1744-6414,1744-6422,NA,0,1,0,0,NA,Economics | Law,NA,OXFORD UNIV PRESS,NA +journal of competitiveness,1804-171X,1804-1728,NA,0,1,0,0,NA,Business | Economics | Management,NA,"UNIV TOMASE BATI & ZLINE, FAK MANAGEMENTU EKONOMIKY",NA +journal of complex networks,2051-1310,2051-1329,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications",NA,NA,OXFORD UNIV PRESS,NA +journal of complexity,0885-064X,1090-2708,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of composite materials,0021-9983,1530-793X,NA,0,0,1,0,"Materials Science, Composites",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of composites for construction,1090-0268,1943-5614,NA,0,0,1,0,"Engineering, Civil | Mechanics | Materials Science, Composites",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of computational and applied mathematics,0377-0427,1879-1778,NA,0,0,1,0,"Mathematics, Applied",NA,NA,ELSEVIER,NA +journal of computational and graphical statistics,1061-8600,1537-2715,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +journal of computational and nonlinear dynamics,1555-1423,1555-1415,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,ASME,NA +journal of computational and theoretical transport,2332-4309,2332-4325,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,TAYLOR & FRANCIS INC,NA +journal of computational biology,1066-5277,1557-8666,JournalCompBio,0,0,1,1,"Biochemical Research Methods | Biotechnology & Applied Microbiology | Computer Science, Interdisciplinary Applications | Mathematical & Computational Biology | Statistics & Probability",NA,NA,"MARY ANN LIEBERT, INC",2021-08-16 +journal of computational biophysics and chemistry,2737-4165,2737-4173,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of computational chemistry,0192-8651,1096-987X,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY,NA +journal of computational design and engineering,2288-4300,2288-5048,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Multidisciplinary",NA,NA,OXFORD UNIV PRESS,NA +journal of computational electronics,1569-8025,1572-8137,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,SPRINGER,NA +journal of computational finance,1460-1559,1755-2850,NA,0,1,0,0,NA,"Business, Finance",NA,INCISIVE MEDIA,NA +journal of computational mathematics,0254-9409,1991-7139,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,GLOBAL SCIENCE PRESS,NA +journal of computational neuroscience,0929-5313,1573-6873,NA,0,0,1,0,Mathematical & Computational Biology | Neurosciences,NA,NA,SPRINGER,NA +journal of computational physics,0021-9991,1090-2716,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Physics, Mathematical",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of computational science,1877-7503,1877-7511,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +journal of computer-aided molecular design,0920-654X,1573-4951,NA,0,0,1,0,"Biochemistry & Molecular Biology | Biophysics | Computer Science, Interdisciplinary Applications",NA,NA,SPRINGER,NA +journal of computer-mediated communication,1083-6101,1083-6101,ica_jcmc,0,1,0,1,NA,Communication | Information Science & Library Science,NA,OXFORD UNIV PRESS INC,2021-12-26 +journal of computer and system sciences,0022-0000,1090-2724,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of computer and systems sciences international,1064-2307,1555-6530,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Cybernetics | Computer Science, Theory & Methods",NA,NA,PLEIADES PUBLISHING INC,NA +journal of computer assisted learning,0266-4909,1365-2729,NA,0,1,0,0,NA,Education & Educational Research,NA,WILEY,NA +journal of computer assisted tomography,0363-8715,1532-3145,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of computer information systems,0887-4417,2380-2057,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,TAYLOR & FRANCIS INC,NA +journal of computer languages,2590-1184,2665-9182,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,ELSEVIER SCI LTD,NA +journal of computer science and technology,1000-9000,1860-4749,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,SCIENCE PRESS,NA +journal of computing and information science in engineering,1530-9827,1944-7078,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Manufacturing",NA,NA,ASME,NA +journal of computing in civil engineering,0887-3801,1943-5487,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of computing in higher education,1042-1726,1867-1233,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +journal of conchology,0022-0019,NA,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,CONCHOLOGICAL SOC GREAT BRITAIN & IRELAND,NA +journal of conflict resolution,0022-0027,1552-8766,NA,0,1,0,0,NA,International Relations | Political Science,NA,SAGE PUBLICATIONS INC,NA +journal of consciousness studies,1355-8250,2051-2201,NA,1,1,0,0,NA,"Social Sciences, Interdisciplinary",Philosophy,IMPRINT ACADEMIC,NA +journal of consciousness studies,1355-8250,2051-2201,NA,1,1,0,0,NA,"Social Sciences, Interdisciplinary",Philosophy,IMPRINT ACADEMIC,NA +journal of construction engineering and management,0733-9364,1943-7862,NA,0,0,1,0,"Construction & Building Technology | Engineering, Industrial | Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of constructional steel research,0143-974X,1873-5983,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,ELSEVIER SCI LTD,NA +journal of constructivist psychology,1072-0537,1521-0650,NA,0,1,0,0,NA,"Psychology, Clinical",NA,TAYLOR & FRANCIS INC,NA +journal of consulting and clinical psychology,0022-006X,1939-2117,NA,0,1,0,0,NA,"Psychology, Clinical",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of consumer affairs,0022-0078,1745-6606,NA,0,1,0,0,NA,Business | Economics,NA,WILEY,NA +journal of consumer behaviour,1472-0817,1479-1838,NA,0,1,0,0,NA,Business,NA,WILEY,NA +journal of consumer culture,1469-5405,1741-2900,consumercul,1,1,0,1,NA,Cultural Studies | Sociology,Cultural Studies,SAGE PUBLICATIONS LTD,2017-12-13 +journal of consumer culture,1469-5405,1741-2900,consumercul,1,1,0,1,NA,Cultural Studies | Sociology,Cultural Studies,SAGE PUBLICATIONS LTD,2017-12-13 +journal of consumer protection and food safety,1661-5751,1661-5867,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER INT PUBL AG,NA +journal of consumer psychology,1057-7408,1532-7663,NA,0,1,0,0,NA,"Business | Psychology, Applied",NA,JOHN WILEY & SONS LTD,NA +journal of consumer research,0093-5301,1537-5277,JCRNEWS,0,1,0,1,NA,Business,NA,OXFORD UNIV PRESS INC,2009-09-01 +journal of contaminant hydrology,0169-7722,1873-6009,NA,0,0,1,0,"Environmental Sciences | Geosciences, Multidisciplinary | Water Resources",NA,NA,ELSEVIER,NA +journal of contemporary accounting & economics,1815-5669,1815-5669,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER SCI LTD,NA +journal of contemporary asia,0047-2336,1752-7554,NA,0,1,0,0,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of contemporary brachytherapy,1689-832X,2081-2841,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,TERMEDIA PUBLISHING HOUSE LTD,NA +journal of contemporary china,1067-0564,1469-9400,NA,0,1,0,0,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of contemporary criminal justice,1043-9862,1552-5406,NA,0,1,0,0,NA,Criminology & Penology,NA,SAGE PUBLICATIONS INC,NA +journal of contemporary ethnography,0891-2416,1552-5414,NA,0,1,0,0,NA,Sociology | Urban Studies,NA,SAGE PUBLICATIONS INC,NA +journal of contemporary european studies,1478-2804,1478-2790,journalces,0,1,0,1,NA,Area Studies | International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-08-01 +journal of contemporary history,0022-0094,1461-7250,jconthist,1,1,0,1,NA,History,History,SAGE PUBLICATIONS LTD,2014-09-05 +journal of contemporary history,0022-0094,1461-7250,jconthist,1,1,0,1,NA,History,History,SAGE PUBLICATIONS LTD,2014-09-05 +journal of contemporary mathematical analysis-armenian academy of sciences,1068-3623,1934-9416,NA,0,0,1,0,Mathematics,NA,NA,PLEIADES PUBLISHING INC,NA +journal of contemporary physics-armenian academy of sciences,1068-3372,1934-9378,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,PLEIADES PUBLISHING INC,NA +journal of contemporary religion,1353-7903,1469-9419,NA,1,0,0,0,NA,NA,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of contextual behavioral science,2212-1447,2212-1455,NA,0,1,0,0,NA,"Psychology, Clinical",NA,ELSEVIER,NA +journal of contingencies and crisis management,0966-0879,1468-5973,NA,0,1,0,0,NA,Management,NA,WILEY,NA +journal of continuing education in nursing,0022-0124,1938-2472,JCENJournal,0,1,1,1,Nursing,Nursing,NA,SLACK INC,2009-12-10 +journal of continuing education in nursing,0022-0124,1938-2472,JCENJournal,0,1,1,1,Nursing,Nursing,NA,SLACK INC,2009-12-10 +journal of continuing education in the health professions,0894-1912,1554-558X,NA,0,0,1,0,"Education, Scientific Disciplines | Health Care Sciences & Services",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of controlled release,0168-3659,1873-4995,JCRnEDITORS,0,0,1,1,"Chemistry, Multidisciplinary | Pharmacology & Pharmacy",NA,NA,ELSEVIER,2011-07-08 +journal of convex analysis,0944-6532,0944-6532,NA,0,0,1,0,Mathematics,NA,NA,HELDERMANN VERLAG,NA +journal of coordination chemistry,0095-8972,1029-0389,J_CoordChem,0,0,1,1,"Chemistry, Inorganic & Nuclear",NA,NA,TAYLOR & FRANCIS LTD,2021-07-26 +journal of corporate finance,0929-1199,1872-6313,JCorpFin,0,1,0,1,NA,"Business, Finance",NA,ELSEVIER,2021-01-07 +journal of corporate law studies,1473-5970,1757-8426,NA,0,1,0,0,NA,Law,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of correctional health care,1078-3458,1940-5200,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,"MARY ANN LIEBERT, INC",NA +journal of cosmetic and laser therapy,1476-4172,1476-4180,NA,0,0,1,0,Dermatology | Surgery,NA,NA,TAYLOR & FRANCIS INC,NA +journal of cosmetic dermatology,1473-2130,1473-2165,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +journal of cosmetic science,1525-7886,NA,NA,0,0,1,0,"Chemistry, Applied | Dermatology",NA,NA,SOC COSMETIC CHEMISTS,NA +journal of cosmology and astroparticle physics,1475-7516,1475-7516,NA,0,0,1,0,"Astronomy & Astrophysics | Physics, Particles & Fields",NA,NA,IOP PUBLISHING LTD,NA +journal of counseling and development,0748-9633,1556-6676,NA,0,1,0,0,NA,"Psychology, Applied",NA,WILEY,NA +journal of counseling psychology,0022-0167,1939-2168,NA,0,1,0,0,NA,"Psychology, Educational | Psychology, Applied",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of cranio-maxillofacial surgery,1010-5182,1878-4119,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Surgery",NA,NA,CHURCHILL LIVINGSTONE,NA +journal of craniofacial surgery,1049-2275,1536-3732,NA,0,0,1,0,Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of creative behavior,0022-0175,2162-6057,NA,0,1,0,0,NA,"Psychology, Educational",NA,WILEY,NA +journal of credit risk,1744-6619,1755-9723,NA,0,1,0,0,NA,"Business, Finance",NA,INCISIVE MEDIA,NA +journal of crime & justice,0735-648X,2158-9119,NA,0,1,0,0,NA,Criminology & Penology,NA,TAYLOR & FRANCIS INC,NA +journal of criminal justice,0047-2352,1873-6203,NA,0,1,0,0,NA,Criminology & Penology,NA,ELSEVIER,NA +journal of criminal law & criminology,0091-4169,2160-0325,jclcnlaw,0,1,0,1,NA,Criminology & Penology | Law,NA,NORTHWESTERN UNIV,2020-02-18 +journal of criminology,2633-8076,2633-8084,NA,0,1,0,0,NA,Criminology & Penology,NA,SAGE PUBLICATIONS LTD,NA +journal of critical care,0883-9441,1557-8615,NA,0,0,1,0,Critical Care Medicine,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +journal of crohns & colitis,1873-9946,1876-4479,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,OXFORD UNIV PRESS,NA +journal of cross-cultural psychology,0022-0221,1552-5422,NA,0,1,0,0,NA,"Psychology, Social",NA,SAGE PUBLICATIONS INC,NA +journal of crustacean biology,0278-0372,1937-240X,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,OXFORD UNIV PRESS,NA +journal of cryptographic engineering,2190-8508,2190-8516,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,SPRINGER HEIDELBERG,NA +journal of cryptology,0933-2790,1432-1378,NA,0,0,1,0,"Computer Science, Theory & Methods | Engineering, Electrical & Electronic | Mathematics, Applied",NA,NA,SPRINGER,NA +journal of crystal growth,0022-0248,1873-5002,NA,0,0,1,0,"Crystallography | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER,NA +journal of cultural economics,0885-2545,1573-6997,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +journal of cultural economy,1753-0350,1753-0369,jcultecon,1,1,0,1,NA,Cultural Studies | Economics | Sociology,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-11-07 +journal of cultural economy,1753-0350,1753-0369,jcultecon,1,1,0,1,NA,Cultural Studies | Economics | Sociology,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-11-07 +journal of cultural heritage,1296-2074,1778-3674,NA,1,0,1,0,"Chemistry, Analytical | Geosciences, Multidisciplinary | Materials Science, Multidisciplinary | Spectroscopy",NA,Art | Archaeology,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +journal of cultural heritage,1296-2074,1778-3674,NA,1,0,1,0,"Chemistry, Analytical | Geosciences, Multidisciplinary | Materials Science, Multidisciplinary | Spectroscopy",NA,Art | Archaeology,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +journal of current southeast asian affairs,1868-1034,1868-4882,NA,0,1,0,0,NA,Political Science | International Relations | Area Studies,NA,SAGE PUBLICATIONS INC,NA +journal of curriculum studies,0022-0272,1366-5839,CurriculumOf,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-03-23 +journal of cutaneous medicine and surgery,1203-4754,1615-7109,JCMS1926,0,0,1,1,Dermatology,NA,NA,SAGE PUBLICATIONS INC,2017-08-16 +journal of cutaneous pathology,0303-6987,1600-0560,NA,0,0,1,0,Dermatology | Pathology,NA,NA,WILEY,NA +journal of cystic fibrosis,1569-1993,1873-5010,JournalofCF,0,0,1,1,Respiratory System,NA,NA,ELSEVIER,2016-04-07 +journal of cytology,0970-9371,0974-5165,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +journal of dairy research,0022-0299,1469-7629,OurJDR,0,0,1,1,"Agriculture, Dairy & Animal Science | Food Science & Technology",NA,NA,CAMBRIDGE UNIV PRESS,2019-08-06 +journal of dairy science,0022-0302,1525-3198,jdairyscience,0,0,1,1,"Agriculture, Dairy & Animal Science | Food Science & Technology",NA,NA,ELSEVIER SCIENCE INC,2015-03-14 +journal of database management,1063-8016,1533-8010,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,IGI GLOBAL,NA +journal of deaf studies and deaf education,1081-4159,1465-7325,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,OXFORD UNIV PRESS,NA +journal of democracy,1045-5736,1086-3214,jodemocracy,0,1,0,1,NA,Political Science,NA,JOHNS HOPKINS UNIV PRESS,2013-02-01 +journal of demographic economics,2054-0892,2054-0906,NA,0,1,0,0,NA,Demography | Economics,NA,CAMBRIDGE UNIV PRESS,NA +journal of dental education,0022-0337,1930-7837,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +journal of dental research,0022-0345,1544-0591,JDentRes,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,SAGE PUBLICATIONS INC,2020-07-17 +journal of dental sciences,1991-7902,2213-8862,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER TAIWAN,NA +journal of dentistry,0300-5712,1879-176X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER SCI LTD,NA +journal of derivatives,1074-1240,2168-8524,NA,0,1,0,0,NA,"Business, Finance",NA,PAGEANT MEDIA LTD,NA +journal of dermatological science,0923-1811,1873-569X,NA,0,0,1,0,Dermatology,NA,NA,ELSEVIER IRELAND LTD,NA +journal of dermatological treatment,0954-6634,1471-1753,NA,0,0,1,0,Dermatology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of dermatology,0385-2407,1346-8138,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +journal of design history,0952-4649,1741-7279,JoDesignHistory,1,0,0,1,NA,NA,Art,OXFORD UNIV PRESS,2012-03-14 +journal of destination marketing & management,2212-571X,2212-5752,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Management",NA,ELSEVIER,NA +journal of development economics,0304-3878,1872-6089,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +journal of development effectiveness,1943-9342,1943-9407,NA,0,1,0,0,NA,Development Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of development studies,0022-0388,1743-9140,JDevStudies,0,1,0,1,NA,Development Studies | Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-09-02 +journal of developmental and behavioral pediatrics,0196-206X,1536-7312,NA,0,1,1,0,Behavioral Sciences | Pediatrics,"Psychology, Development",NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of developmental and behavioral pediatrics,0196-206X,1536-7312,NA,0,1,1,0,Behavioral Sciences | Pediatrics,"Psychology, Development",NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of developmental and life-course criminology,2199-4641,2199-465X,NA,0,1,0,0,NA,Criminology & Penology,NA,SPRINGER INT PUBL AG,NA +journal of developmental and physical disabilities,1056-263X,1573-3580,NA,0,1,0,0,NA,"Education, Special | Psychology, Development | Rehabilitation",NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of developmental origins of health and disease,2040-1744,2040-1752,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of dharma,0253-7222,NA,NA,1,0,0,0,NA,NA,Religion,DHARMARAM COLLEGE,NA +journal of diabetes,1753-0393,1753-0407,JournalDiabetes,0,0,1,1,Endocrinology & Metabolism,NA,NA,WILEY,2018-05-31 +journal of diabetes and its complications,1056-8727,1873-460X,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,ELSEVIER SCIENCE INC,NA +journal of diabetes investigation,2040-1116,2040-1124,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,WILEY,NA +journal of diabetes research,2314-6745,2314-6753,NA,0,0,1,0,"Endocrinology & Metabolism | Medicine, Research & Experimental",NA,NA,HINDAWI LTD,NA +journal of difference equations and applications,1023-6198,1563-5120,NA,0,0,1,0,"Mathematics, Applied",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of differential equations,0022-0396,1090-2732,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of differential geometry,0022-040X,1945-743X,NA,0,0,1,0,Mathematics,NA,NA,"INT PRESS BOSTON, INC",NA +journal of digestive diseases,1751-2972,1751-2980,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,WILEY,NA +journal of digital imaging,0897-1889,1618-727X,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +journal of disability policy studies,1044-2073,1538-4802,NA,0,1,0,0,NA,Rehabilitation,NA,SAGE PUBLICATIONS INC,NA +journal of dispersion science and technology,0193-2691,1532-2351,NA,0,0,1,0,"Chemistry, Physical",NA,NA,TAYLOR & FRANCIS INC,NA +journal of diversity in higher education,1938-8926,1938-8934,JDHEtweets,0,1,0,1,NA,"Education & Educational Research | Psychology, Educational | Psychology, Social",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,2019-09-04 +journal of documentation,0022-0418,1758-7379,NA,0,1,0,0,NA,Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of drug delivery science and technology,1773-2247,2588-8943,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +journal of drug issues,0022-0426,1945-1369,NA,0,1,0,0,NA,Substance Abuse,NA,SAGE PUBLICATIONS INC,NA +journal of drug targeting,1061-186X,1029-2330,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of drugs in dermatology,1545-9616,1545-9616,JDDOnline,0,0,1,1,Dermatology,NA,NA,JOURNAL OF DRUGS IN DERMATOLOGY,2016-08-22 +journal of dual diagnosis,1550-4263,1550-4271,JDualDiagnosis,0,1,0,1,NA,"Psychology, Clinical | Substance Abuse | Psychiatry",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-12-18 +journal of dynamic systems measurement and control-transactions of the asme,0022-0434,1528-9028,NA,0,0,1,0,Automation & Control Systems | Instruments & Instrumentation,NA,NA,ASME,NA +journal of dynamical and control systems,1079-2724,1573-8698,NA,0,0,1,0,"Automation & Control Systems | Mathematics, Applied",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of dynamics and differential equations,1040-7294,1572-9222,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER,NA +journal of early adolescence,0272-4316,1552-5449,NA,0,1,0,0,NA,"Family Studies | Psychology, Development",NA,SAGE PUBLICATIONS INC,NA +journal of early childhood literacy,1468-7984,1741-2919,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS LTD,NA +journal of early christian studies,1067-6341,1086-3184,NA,1,0,0,0,NA,NA,Religion | History,JOHNS HOPKINS UNIV PRESS,NA +journal of early intervention,1053-8151,2154-3992,NA,0,1,0,0,NA,"Education, Special | Psychology, Educational | Rehabilitation",NA,SAGE PUBLICATIONS INC,NA +journal of early modern history,1385-3783,1570-0658,EarlyModHistory,1,1,0,1,NA,History,History,BRILL,2021-10-26 +journal of early modern history,1385-3783,1570-0658,EarlyModHistory,1,1,0,1,NA,History,History,BRILL,2021-10-26 +journal of earth science,1674-487X,1867-111X,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,"CHINA UNIV GEOSCIENCES, WUHAN",NA +journal of earth system science,2347-4327,0973-774X,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,INDIAN ACAD SCIENCES,NA +journal of earthquake and tsunami,1793-4311,1793-7116,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of earthquake engineering,1363-2469,1559-808X,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of east asian linguistics,0925-8558,1572-8560,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SPRINGER,NA +journal of east asian linguistics,0925-8558,1572-8560,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SPRINGER,NA +journal of east asian studies,1598-2408,2234-6643,JEAS_journal,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,CAMBRIDGE UNIV PRESS,2020-04-01 +journal of east european management studies,0949-6181,1862-0019,NA,0,1,0,0,NA,Management,NA,NOMOS VERLAGSGESELLSCHAFT MBH & CO KG,NA +journal of eastern african studies,1753-1055,1753-1063,jeasjournal,0,1,0,1,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-07-01 +journal of eating disorders,2050-2974,2050-2974,JEatDisord,0,1,1,1,Nutrition & Dietetics | Psychiatry,"Psychology, Clinical",NA,BMC,2012-08-17 +journal of eating disorders,2050-2974,2050-2974,JEatDisord,0,1,1,1,Nutrition & Dietetics | Psychiatry,"Psychology, Clinical",NA,BMC,2012-08-17 +journal of ecclesiastical history,0022-0469,1469-7637,NA,1,0,0,0,NA,NA,Religion | History,CAMBRIDGE UNIV PRESS,NA +journal of ecology,0022-0477,1365-2745,JEcology,0,0,1,1,Plant Sciences | Ecology,NA,NA,WILEY,2009-07-01 +journal of econometrics,0304-4076,1872-6895,JEconometrics,0,1,1,1,"Mathematics, Interdisciplinary Applications","Economics | Social Sciences, Mathematical Methods",NA,ELSEVIER SCIENCE SA,NA +journal of econometrics,0304-4076,1872-6895,JEconometrics,0,1,1,1,"Mathematics, Interdisciplinary Applications","Economics | Social Sciences, Mathematical Methods",NA,ELSEVIER SCIENCE SA,NA +journal of economic behavior & organization,0167-2681,1879-1751,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +journal of economic dynamics & control,0165-1889,1879-1743,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +journal of economic education,0022-0485,2152-4068,JrEconEd,0,1,0,1,NA,Economics | Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-04-01 +journal of economic entomology,0022-0493,1938-291X,NA,0,0,1,0,Entomology,NA,NA,OXFORD UNIV PRESS INC,NA +journal of economic geography,1468-2702,1468-2710,NA,0,1,0,0,NA,Economics | Geography,NA,OXFORD UNIV PRESS,NA +journal of economic growth,1381-4338,1573-7020,j_econ_growth,0,1,0,1,NA,Economics,NA,SPRINGER,2021-12-03 +journal of economic history,0022-0507,1471-6372,NA,1,1,0,0,NA,Economics | History Of Social Sciences,History,CAMBRIDGE UNIV PRESS,NA +journal of economic history,0022-0507,1471-6372,NA,1,1,0,0,NA,Economics | History Of Social Sciences,History,CAMBRIDGE UNIV PRESS,NA +journal of economic inequality,1569-1721,1573-8701,NA,0,1,0,0,NA,Economics,NA,SPRINGERNATURE,NA +journal of economic interaction and coordination,1860-711X,1860-7128,NA,0,1,0,0,NA,Economics,NA,SPRINGER HEIDELBERG,NA +journal of economic issues,0021-3624,1946-326X,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of economic literature,0022-0515,2328-8175,NA,0,1,0,0,NA,Economics,NA,AMER ECONOMIC ASSOC,NA +journal of economic methodology,1350-178X,1469-9427,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of economic perspectives,0895-3309,1944-7965,NA,0,1,0,0,NA,Economics,NA,AMER ECONOMIC ASSOC,NA +journal of economic policy reform,1748-7870,1748-7889,NA,0,1,0,0,NA,Development Studies | Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of economic psychology,0167-4870,1872-7719,NA,0,1,0,0,NA,"Economics | Psychology, Multidisciplinary",NA,ELSEVIER,NA +journal of economic surveys,0950-0804,1467-6419,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +journal of economic theory,0022-0531,1095-7235,NA,0,1,0,0,NA,Economics,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of economics,0931-8658,1617-7134,NA,0,1,0,0,NA,Economics,NA,SPRINGER WIEN,NA +journal of economics & management strategy,1058-6407,1530-9134,jemsjournal,0,1,0,1,NA,Economics | Management,NA,WILEY,2013-07-16 +journal of ect,1095-0680,1533-4112,Jrnl_ECT,0,1,1,1,Behavioral Sciences | Psychiatry,Psychiatry,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-02-15 +journal of ect,1095-0680,1533-4112,Jrnl_ECT,0,1,1,1,Behavioral Sciences | Psychiatry,Psychiatry,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-02-15 +journal of ecumenical studies,0022-0558,2162-3937,NA,1,0,0,0,NA,NA,Religion,JOURNAL ECUMENICAL STUDIES,NA +journal of education for teaching,0260-7476,1360-0540,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of education policy,0268-0939,1464-5106,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of educational and behavioral statistics,1076-9986,1935-1054,NA,0,1,0,0,NA,"Education & Educational Research | Social Sciences, Mathematical Methods | Psychology, Mathematical",NA,SAGE PUBLICATIONS INC,NA +journal of educational and psychological consultation,1047-4412,1532-768X,NA,0,1,0,0,NA,"Psychology, Educational",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of educational change,1389-2843,1573-1812,JournalEdChange,0,1,0,1,NA,Education & Educational Research,NA,SPRINGER,2013-07-17 +journal of educational computing research,0735-6331,1541-4140,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +journal of educational measurement,0022-0655,1745-3984,NA,0,1,0,0,NA,"Psychology, Educational | Psychology, Applied | Psychology, Mathematical",NA,WILEY,NA +journal of educational psychology,0022-0663,1939-2176,NA,0,1,0,0,NA,"Psychology, Educational",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of educational research,0022-0671,1940-0675,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of egyptian archaeology,0307-5133,2514-0582,NA,1,0,0,0,NA,NA,Archaeology,SAGE PUBLICATIONS LTD,NA +journal of elasticity,0374-3535,1573-2681,NA,0,0,1,0,"Engineering, Multidisciplinary | Materials Science, Multidisciplinary | Mechanics",NA,NA,SPRINGER,NA +journal of elastomers and plastics,0095-2443,1530-8006,NA,0,0,1,0,"Materials Science, Multidisciplinary | Polymer Science",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of elder abuse & neglect,0894-6566,1540-4129,NA,0,1,0,0,NA,Gerontology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of electrical engineering-elektrotechnicky casopis,1335-3632,1339-309X,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,SLOVAK UNIV TECHNOLOGY,NA +journal of electrical engineering & technology,1975-0102,2093-7423,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,SPRINGER SINGAPORE PTE LTD,NA +journal of electroanalytical chemistry,1572-6657,1873-2569,NA,0,0,1,0,"Chemistry, Analytical | Electrochemistry",NA,NA,ELSEVIER SCIENCE SA,NA +journal of electrocardiology,0022-0736,1532-8430,JElectrocardiol,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,CHURCHILL LIVINGSTONE INC MEDICAL PUBLISHERS,2018-09-22 +journal of electroceramics,1385-3449,1573-8663,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,SPRINGER,NA +journal of electrochemical energy conversion and storage,2381-6872,2381-6910,NA,0,0,1,0,Electrochemistry | Energy & Fuels,NA,NA,ASME,NA +journal of electrochemical science and technology,2093-8551,2093-8551,NA,0,0,1,0,Electrochemistry,NA,NA,KOREAN ELECTROCHEMISTRY SOC,NA +journal of electromagnetic engineering and science,2671-7255,2671-7263,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,KOREAN INST ELECTROMAGNETIC ENGINEERING & SCIENCE,NA +journal of electromagnetic waves and applications,0920-5071,1569-3937,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of electromyography and kinesiology,1050-6411,1873-5711,NA,0,0,1,0,Neurosciences | Physiology | Rehabilitation | Sport Sciences,NA,NA,ELSEVIER SCI LTD,NA +journal of electron spectroscopy and related phenomena,0368-2048,1873-2526,NA,0,0,1,0,Spectroscopy,NA,NA,ELSEVIER,NA +journal of electronic commerce research,1526-6133,1938-9027,NA,0,1,0,0,NA,Business,NA,CALIFORNIA STATE UNIV,NA +journal of electronic imaging,1017-9909,1560-229X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Imaging Science & Photographic Technology",NA,NA,IS&T & SPIE,NA +journal of electronic materials,0361-5235,1543-186X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,SPRINGER,NA +journal of electronic packaging,1043-7398,1528-9044,asmejep,0,0,1,1,"Engineering, Electrical & Electronic | Engineering, Mechanical",NA,NA,ASME,2020-11-03 +journal of electronic testing-theory and applications,0923-8174,1573-0727,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +journal of electrostatics,0304-3886,1873-5738,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,ELSEVIER,NA +journal of elementology,1644-2296,1644-2296,NA,0,0,1,0,Environmental Sciences,NA,NA,POLISH SOCIETY MAGNESIUM RESEARCH,NA +journal of emergency medicine,0736-4679,1090-1280,jem_journal,0,0,1,1,Emergency Medicine,NA,NA,ELSEVIER SCIENCE INC,2015-05-19 +journal of emergency nursing,0099-1767,1527-2966,NA,0,1,1,0,Emergency Medicine | Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +journal of emergency nursing,0099-1767,1527-2966,NA,0,1,1,0,Emergency Medicine | Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +journal of emotional and behavioral disorders,1063-4266,1538-4799,NA,0,1,0,0,NA,"Education, Special | Psychology, Educational | Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +journal of empirical finance,0927-5398,1879-1727,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +journal of empirical legal studies,1740-1453,1740-1461,NA,0,1,0,0,NA,Law,NA,WILEY,NA +journal of empirical research on human research ethics,1556-2646,1556-2654,NA,0,1,1,0,Medical Ethics,Ethics,NA,SAGE PUBLICATIONS INC,NA +journal of empirical research on human research ethics,1556-2646,1556-2654,NA,0,1,1,0,Medical Ethics,Ethics,NA,SAGE PUBLICATIONS INC,NA +journal of employment counseling,0022-0787,2161-1920,NA,0,1,0,0,NA,"Psychology, Applied",NA,WILEY,NA +journal of endocrinological investigation,0391-4097,1720-8386,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER,NA +journal of endocrinology,0022-0795,1479-6805,JEndocrinology,0,0,1,1,Endocrinology & Metabolism,NA,NA,BIOSCIENTIFICA LTD,2015-12-15 +journal of endodontics,0099-2399,1878-3554,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER SCIENCE INC,NA +journal of endourology,0892-7790,1557-900X,JEndourology,0,0,1,1,Urology & Nephrology,NA,NA,"MARY ANN LIEBERT, INC",2013-08-06 +journal of endovascular therapy,1526-6028,1545-1550,NA,0,0,1,0,Surgery | Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS INC,NA +journal of energetic materials,0737-0652,1545-8822,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Engineering, Chemical | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS INC,NA +journal of energy chemistry,2095-4956,2095-4956,JEnergyChem1,0,0,1,1,"Chemistry, Applied | Chemistry, Physical | Energy & Fuels | Engineering, Chemical",NA,NA,ELSEVIER,2022-01-10 +journal of energy engineering,0733-9402,1943-7897,NA,0,0,1,0,"Energy & Fuels | Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of energy in southern africa,1021-447X,2413-3051,JournalEnergySA,0,0,1,1,Energy & Fuels,NA,NA,"UNIV CAPE TOWN, ENERGY RES CENTRE",2018-10-12 +journal of energy resources technology-transactions of the asme,0195-0738,1528-8994,NA,0,0,1,0,Energy & Fuels,NA,NA,ASME,NA +journal of energy storage,2352-152X,2352-152X,NA,0,0,1,0,Energy & Fuels,NA,NA,ELSEVIER,NA +journal of engineered fibers and fabrics,1558-9250,1558-9250,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of engineering and technology management,0923-4748,1879-1719,NA,0,1,1,0,"Engineering, Industrial",Business | Management,NA,ELSEVIER,NA +journal of engineering and technology management,0923-4748,1879-1719,NA,0,1,1,0,"Engineering, Industrial",Business | Management,NA,ELSEVIER,NA +journal of engineering design,0954-4828,1466-1837,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of engineering education,1069-4730,2168-9830,JEE_Editors,0,1,1,1,"Education, Scientific Disciplines | Engineering, Multidisciplinary",Education & Educational Research,NA,AMER SOC ENGINEERING EDUCATION,2018-09-20 +journal of engineering education,1069-4730,2168-9830,JEE_Editors,0,1,1,1,"Education, Scientific Disciplines | Engineering, Multidisciplinary",Education & Educational Research,NA,AMER SOC ENGINEERING EDUCATION,2018-09-20 +journal of engineering for gas turbines and power-transactions of the asme,0742-4795,1528-8919,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASME,NA +journal of engineering materials and technology-transactions of the asme,0094-4289,1528-8889,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,ASME,NA +journal of engineering mathematics,0022-0833,1573-2703,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER,NA +journal of engineering mechanics,0733-9399,1943-7889,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of engineering research,2307-1877,2307-1885,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,ACADEMIC PUBLICATION COUNCIL,NA +journal of engineering technology,0747-9964,NA,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,AMER SOC ENGINEERING EDUCATION,NA +journal of engineering thermophysics,1810-2328,1990-5432,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical | Mechanics",NA,NA,PLEIADES PUBLISHING INC,NA +journal of english and germanic philology,0363-6941,NA,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian | Language & Linguistics | Medieval & Renaissance Studies | Literature, British Isles",UNIV ILLINOIS PRESS,NA +journal of english for academic purposes,1475-1585,1878-1497,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,ELSEVIER,NA +journal of english for academic purposes,1475-1585,1878-1497,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,ELSEVIER,NA +journal of english linguistics,0075-4242,1552-5457,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SAGE PUBLICATIONS INC,NA +journal of english linguistics,0075-4242,1552-5457,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SAGE PUBLICATIONS INC,NA +journal of enhanced heat transfer,1065-5131,1563-5074,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,BEGELL HOUSE INC,NA +journal of enterprise information management,1741-0398,1758-7409,NA,0,1,0,0,NA,Information Science & Library Science | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of entomological science,0749-8004,NA,NA,0,0,1,0,Entomology,NA,NA,GEORGIA ENTOMOLOGICAL SOC INC,NA +journal of environment & development,1070-4965,1552-5465,NA,0,1,0,0,NA,Development Studies | Environmental Studies | Regional & Urban Planning,NA,SAGE PUBLICATIONS INC,NA +journal of environmental and engineering geophysics,1083-1363,1943-2658,NA,0,0,1,0,"Geochemistry & Geophysics | Engineering, Geological",NA,NA,ENVIRONMENTAL ENGINEERING GEOPHYSICAL SOC,NA +journal of environmental chemical engineering,2213-2929,2213-3437,JEnvironChemEng,0,0,1,1,"Engineering, Environmental | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,2021-10-07 +journal of environmental economics and management,0095-0696,1096-0449,JEEM_tweets,0,1,0,1,NA,Business | Economics | Environmental Studies,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2020-08-13 +journal of environmental education,0095-8964,1940-1892,JournalEnvEd,0,1,0,1,NA,Education & Educational Research | Environmental Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-24 +journal of environmental engineering,0733-9372,1943-7870,ASCE_JEE,0,0,1,1,"Engineering, Environmental | Engineering, Civil | Environmental Sciences",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,2020-12-12 +journal of environmental engineering and landscape management,1648-6897,1822-4199,NA,0,0,1,0,Environmental Sciences,NA,NA,VILNIUS GEDIMINAS TECH UNIV,NA +journal of environmental health,0022-0892,0022-0892,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,"NATL ENVIRON HEALTH ASSOC",NA +journal of environmental health science and engineering,2052-336X,2052-336X,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,SPRINGER,NA +journal of environmental informatics,1726-2135,1684-8799,NA,0,0,1,0,Environmental Sciences,NA,NA,INT SOC ENVIRON INFORM SCI,NA +journal of environmental law,0952-8873,1464-374X,NA,0,1,0,0,NA,Environmental Studies | Law,NA,OXFORD UNIV PRESS,NA +journal of environmental management,0301-4797,1095-8630,NA,0,0,1,0,Environmental Sciences,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of environmental pathology toxicology and oncology,0731-8898,2162-6537,NA,0,0,1,0,Toxicology,NA,NA,BEGELL HOUSE INC,NA +journal of environmental planning and management,0964-0568,1360-0559,NA,0,1,0,0,NA,Development Studies | Regional & Urban Planning,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of environmental policy & planning,1523-908X,1522-7200,JrlEPP,0,1,0,1,NA,Development Studies | Regional & Urban Planning,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-10-29 +journal of environmental protection and ecology,1311-5065,1311-5065,NA,0,0,1,0,Environmental Sciences,NA,NA,SCIBULCOM LTD,NA +journal of environmental psychology,0272-4944,1522-9610,JEnvPsych,0,1,0,1,NA,"Environmental Studies | Psychology, Multidisciplinary",NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,2019-02-21 +journal of environmental quality,0047-2425,1537-2537,JEnvironQual,0,0,1,1,Environmental Sciences,NA,NA,WILEY,2015-03-04 +journal of environmental radioactivity,0265-931X,1879-1700,NA,0,0,1,0,Environmental Sciences,NA,NA,ELSEVIER SCI LTD,NA +journal of environmental science and health part a-toxic/hazardous substances & environmental engineering,1093-4529,1532-4117,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,TAYLOR & FRANCIS INC,NA +journal of environmental science and health part b-pesticides food contaminants and agricultural wastes,0360-1234,1532-4109,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,TAYLOR & FRANCIS INC,NA +journal of environmental science and health part c-toxicology and carcinogenesis,2689-6583,2689-6591,NA,0,0,1,0,Toxicology | Environmental Sciences | Oncology,NA,NA,TAYLOR & FRANCIS INC,NA +journal of environmental science and management,0119-1144,0119-1144,NA,0,0,1,0,Environmental Sciences,NA,NA,"UNIV PHILIPPINES LOS BANOS, COLLEGE",NA +journal of environmental sciences,1001-0742,1878-7320,NA,0,0,1,0,Environmental Sciences,NA,NA,SCIENCE PRESS,NA +journal of enzyme inhibition and medicinal chemistry,1475-6366,1475-6374,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Medicinal",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of epidemiology,0917-5040,0917-5040,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,JAPAN EPIDEMIOLOGICAL ASSOC,NA +journal of epidemiology and community health,0143-005X,1470-2738,JECH_BMJ,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMJ PUBLISHING GROUP,2010-05-07 +journal of epidemiology and community health,0143-005X,1470-2738,JECH_BMJ,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMJ PUBLISHING GROUP,2010-05-07 +journal of epidemiology and global health,2210-6006,2210-6014,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SPRINGERNATURE,NA +journal of epidemiology and global health,2210-6006,2210-6014,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SPRINGERNATURE,NA +journal of equine veterinary science,0737-0806,1542-7412,NA,0,0,1,0,Veterinary Sciences,NA,NA,ELSEVIER SCIENCE INC,NA +journal of essential oil bearing plants,0972-060X,0976-5026,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of essential oil research,1041-2905,2163-8152,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,TAYLOR & FRANCIS INC,NA +journal of esthetic and restorative dentistry,1496-4155,1708-8240,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +journal of ethnic and migration studies,1369-183X,1469-9451,NA,0,1,0,0,NA,Demography | Ethnic Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of ethnicity in substance abuse,1533-2640,1533-2659,NA,0,1,1,0,Substance Abuse,Substance Abuse,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of ethnicity in substance abuse,1533-2640,1533-2659,NA,0,1,1,0,Substance Abuse,Substance Abuse,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of ethnobiology,0278-0771,2162-4496,NA,0,1,1,0,Biology,Anthropology,NA,SOC ETHNOBIOLOGY,NA +journal of ethnobiology,0278-0771,2162-4496,NA,0,1,1,0,Biology,Anthropology,NA,SOC ETHNOBIOLOGY,NA +journal of ethnobiology and ethnomedicine,1746-4269,1746-4269,NA,0,0,1,0,Biodiversity Conservation | Plant Sciences | Pharmacology & Pharmacy,NA,NA,BMC,NA +journal of ethnopharmacology,0378-8741,1872-7573,NA,0,0,1,0,"Plant Sciences | Chemistry, Medicinal | Integrative & Complementary Medicine | Pharmacology & Pharmacy",NA,NA,ELSEVIER IRELAND LTD,NA +journal of ethology,0289-0771,1439-5444,J_Ethology,0,0,1,1,Behavioral Sciences | Zoology,NA,NA,SPRINGER JAPAN KK,2021-09-23 +journal of eukaryotic microbiology,1066-5234,1550-7408,JEukMicro,0,0,1,1,Microbiology,NA,NA,WILEY,2021-07-16 +journal of european integration,0703-6337,1477-2280,jei_publication,0,1,0,1,NA,International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-01-26 +journal of european public policy,1350-1763,1466-4429,jepp_journal,0,1,0,1,NA,Political Science | Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-10-19 +journal of european social policy,0958-9287,1461-7269,JournalESP,0,1,0,1,NA,Public Administration | Social Issues,NA,SAGE PUBLICATIONS LTD,2018-09-12 +journal of european studies,0047-2441,1740-2379,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",SAGE PUBLICATIONS LTD,NA +journal of evaluation in clinical practice,1356-1294,1365-2753,NA,0,0,1,0,"Health Care Sciences & Services | Medical Informatics | Medicine, General & Internal",NA,NA,WILEY,NA +journal of evidence-based dental practice,1532-3382,1532-3390,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER INC,NA +journal of evidence-based psychotherapies,2360-0853,NA,JournalJEBP,0,1,0,1,NA,"Psychology, Clinical",NA,INT INST ADVANCED STUDIES PSYCHOTHERAPY & APPLIED MENTAL HEALTH,2020-05-13 +journal of evidence based medicine,1756-5383,1756-5391,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,WILEY,NA +journal of evolution equations,1424-3199,1424-3202,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +journal of evolutionary biochemistry and physiology,0022-0930,1608-3202,NA,0,0,1,0,Biochemistry & Molecular Biology | Evolutionary Biology | Physiology,NA,NA,PLEIADES PUBLISHING INC,NA +journal of evolutionary biology,1010-061X,1420-9101,JEvBio,0,0,1,1,Ecology | Evolutionary Biology | Genetics & Heredity,NA,NA,WILEY,2020-04-08 +journal of evolutionary economics,0936-9937,1432-1386,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +journal of exercise science & fitness,1728-869X,1728-869X,NA,0,0,1,0,Sport Sciences,NA,NA,ELSEVIER SINGAPORE PTE LTD,NA +journal of exotic pet medicine,1557-5063,1931-6283,NA,0,0,1,0,Veterinary Sciences,NA,NA,ELSEVIER SCIENCE INC,NA +journal of experimental & clinical cancer research,1756-9966,1756-9966,JournalofExper1,0,0,1,1,Oncology,NA,NA,BMC,2020-01-17 +journal of experimental & theoretical artificial intelligence,0952-813X,1362-3079,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of experimental and theoretical physics,1063-7761,1090-6509,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,PLEIADES PUBLISHING INC,NA +journal of experimental biology,0022-0949,1477-9145,J_Exp_Biol,0,0,1,1,Biology,NA,NA,COMPANY BIOLOGISTS LTD,2009-09-28 +journal of experimental botany,0022-0957,1460-2431,JXBot,0,0,1,1,Plant Sciences,NA,NA,OXFORD UNIV PRESS,2011-11-17 +journal of experimental child psychology,0022-0965,1096-0457,NA,0,1,0,0,NA,"Psychology, Development | Psychology, Experimental",NA,ELSEVIER SCIENCE INC,NA +journal of experimental criminology,1573-3750,1572-8315,NA,0,1,0,0,NA,Criminology & Penology,NA,SPRINGER,NA +journal of experimental education,0022-0973,1940-0683,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of experimental marine biology and ecology,0022-0981,1879-1697,NA,0,0,1,0,Ecology | Marine & Freshwater Biology,NA,NA,ELSEVIER,NA +journal of experimental medicine,0022-1007,1540-9538,JExpMed,0,0,1,1,"Immunology | Medicine, Research & Experimental",NA,NA,ROCKEFELLER UNIV PRESS,2009-09-18 +journal of experimental nanoscience,1745-8080,1745-8099,NA,0,0,1,0,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of experimental psychology-animal learning and cognition,2329-8456,2329-8464,NA,0,1,1,0,Behavioral Sciences | Psychology | Zoology,"Psychology, Biological | Psychology, Experimental",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of experimental psychology-animal learning and cognition,2329-8456,2329-8464,NA,0,1,1,0,Behavioral Sciences | Psychology | Zoology,"Psychology, Biological | Psychology, Experimental",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of experimental psychology-applied,1076-898X,1939-2192,NA,0,1,0,0,NA,"Psychology, Applied",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of experimental psychology-general,0096-3445,1939-2222,NA,0,1,0,0,NA,"Psychology, Experimental",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of experimental psychology-human perception and performance,0096-1523,1939-1277,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of experimental psychology-human perception and performance,0096-1523,1939-1277,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of experimental psychology-learning memory and cognition,0278-7393,1939-1285,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of experimental psychology-learning memory and cognition,0278-7393,1939-1285,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of experimental psychopathology,2043-8087,2043-8087,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,SAGE PUBLICATIONS LTD,NA +journal of experimental social psychology,0022-1031,1096-0465,NA,0,1,0,0,NA,"Psychology, Social",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of experimental zoology part a-ecological and integrative physiology,2471-5638,2471-5646,JExpZoo_A,0,0,1,1,Zoology,NA,NA,WILEY,2020-02-11 +journal of experimental zoology part b-molecular and developmental evolution,1552-5007,1552-5015,NA,0,0,1,0,Evolutionary Biology | Developmental Biology | Zoology,NA,NA,WILEY,NA +journal of exposure science and environmental epidemiology,1559-0631,1559-064X,JExpSciEnvEpi,0,0,1,1,"Environmental Sciences | Public, Environmental & Occupational Health | Toxicology",NA,NA,SPRINGERNATURE,2018-07-12 +journal of extracellular vesicles,2001-3078,2001-3078,ISEV_JEV,0,0,1,1,Cell Biology,NA,NA,WILEY,2012-04-16 +journal of eye movement research,1995-8692,1995-8692,EyeJournal,0,0,1,1,Ophthalmology,NA,NA,INT GROUP EYE MOVEMENT RESEARCH,NA +journal of family and economic issues,1058-0476,1573-3475,NA,0,1,0,0,NA,Economics | Family Studies,NA,SPRINGER INT PUBL AG,NA +journal of family business strategy,1877-8585,1877-8593,NA,0,1,0,0,NA,Business | Management,NA,ELSEVIER,NA +journal of family history,0363-1990,1552-5473,NA,0,1,0,0,NA,Anthropology | Family Studies | History | History Of Social Sciences,NA,SAGE PUBLICATIONS INC,NA +journal of family issues,0192-513X,1552-5481,NA,0,1,0,0,NA,Family Studies,NA,SAGE PUBLICATIONS INC,NA +journal of family nursing,1074-8407,1552-549X,NA,0,1,1,0,Nursing,Nursing | Family Studies,NA,SAGE PUBLICATIONS INC,NA +journal of family nursing,1074-8407,1552-549X,NA,0,1,1,0,Nursing,Nursing | Family Studies,NA,SAGE PUBLICATIONS INC,NA +journal of family practice,0094-3509,1533-7294,NA,0,0,1,0,"Primary Health Care | Medicine, General & Internal",NA,NA,DOWDEN HEALTH MEDIA,NA +journal of family psychology,0893-3200,1939-1293,NA,0,1,0,0,NA,"Psychology, Clinical | Family Studies",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of family studies,1322-9400,1839-3543,JFamStudies,0,1,0,1,NA,Family Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-11-17 +journal of family theory & review,1756-2570,1756-2589,JFTR_NCFR,0,1,0,1,NA,Family Studies,NA,WILEY,2015-09-03 +journal of family therapy,0163-4445,1467-6427,NA,0,1,0,0,NA,"Psychology, Clinical | Family Studies",NA,WILEY,NA +journal of family violence,0885-7482,1573-2851,journal of family violence,0,1,0,1,NA,"Psychology, Clinical | Family Studies",NA,SPRINGER/PLENUM PUBLISHERS,2018-08-26 +journal of fashion marketing and management,1361-2026,1758-7433,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of feline medicine and surgery,1098-612X,1532-2750,NA,0,0,1,0,Veterinary Sciences,NA,NA,SAGE PUBLICATIONS LTD,NA +journal of feminist studies in religion,8755-4178,1553-3913,NA,1,0,0,0,NA,NA,Religion,INDIANA UNIV PRESS,NA +journal of fiber science and technology,2189-7654,2189-7654,NA,0,0,1,0,"Materials Science, Textiles | Polymer Science",NA,NA,SOC FIBER SCIENCE TECHNOLOGY,NA +journal of field archaeology,0093-4690,2042-4582,J_F_Archaeology,1,0,0,1,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-07-30 +journal of field ornithology,0273-8570,1557-9263,NA,0,0,1,0,Ornithology,NA,NA,WILEY,NA +journal of field robotics,1556-4959,1556-4967,NA,0,0,1,0,Robotics,NA,NA,WILEY,NA +journal of film and video,0742-4671,1934-6018,NA,1,0,0,0,NA,NA,"Film, Radio, Television",UNIV ILLINOIS PRESS,NA +journal of finance,0022-1082,1540-6261,JofFinance,0,1,0,1,NA,"Business, Finance | Economics",NA,WILEY,2012-05-31 +journal of financial and quantitative analysis,0022-1090,1756-6916,JournalFQA,0,1,0,1,NA,"Business, Finance | Economics",NA,CAMBRIDGE UNIV PRESS,2018-03-12 +journal of financial econometrics,1479-8409,1479-8417,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,OXFORD UNIV PRESS,NA +journal of financial economics,0304-405X,1879-2774,J_Fin_Economics,0,1,0,1,NA,"Business, Finance | Economics",NA,ELSEVIER SCIENCE SA,2021-03-17 +journal of financial intermediation,1042-9573,1096-0473,NA,0,1,0,0,NA,"Business, Finance",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of financial markets,1386-4181,1878-576X,NA,0,1,0,0,NA,"Business, Finance",NA,ELSEVIER,NA +journal of financial research,0270-2592,1475-6803,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +journal of financial services research,0920-8550,1573-0735,NA,0,1,0,0,NA,"Business, Finance",NA,SPRINGER,NA +journal of financial stability,1572-3089,1878-0962,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER SCIENCE INC,NA +journal of fire sciences,0734-9041,1530-8049,NA,0,0,1,0,"Engineering, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of fish and wildlife management,1944-687X,NA,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,U S FISH & WILDLIFE SERVICE,NA +journal of fish biology,0022-1112,1095-8649,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,WILEY,NA +journal of fish diseases,0140-7775,1365-2761,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology | Veterinary Sciences,NA,NA,WILEY,NA +journal of fixed point theory and applications,1661-7738,1661-7746,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +journal of flood risk management,1753-318X,1753-318X,JFloodRiskMgmt,0,0,1,1,Environmental Sciences | Water Resources,NA,NA,WILEY,2020-08-12 +journal of flow chemistry,2062-249X,2063-0212,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER,NA +journal of fluency disorders,0094-730X,1873-801X,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,"Rehabilitation | Education, Special | Linguistics",NA,ELSEVIER SCIENCE INC,NA +journal of fluency disorders,0094-730X,1873-801X,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,"Rehabilitation | Education, Special | Linguistics",NA,ELSEVIER SCIENCE INC,NA +journal of fluid mechanics,0022-1120,1469-7645,JFluidMech,0,0,1,1,"Mechanics | Physics, Fluids & Plasmas",NA,NA,CAMBRIDGE UNIV PRESS,2017-05-09 +journal of fluids and structures,0889-9746,1095-8622,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of fluids engineering-transactions of the asme,0098-2202,1528-901X,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASME,NA +journal of fluorescence,1053-0509,1573-4994,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical | Chemistry, Physical",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of fluorine chemistry,0022-1139,1873-3328,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,ELSEVIER SCIENCE SA,NA +journal of folklore research,0737-7037,1543-0413,NA,1,0,0,0,NA,NA,Folklore,INDIANA UNIV PRESS,NA +journal of food and drug analysis,1021-9498,1021-9498,NA,0,0,1,0,Food Science & Technology | Pharmacology & Pharmacy,NA,NA,DIGITAL COMMONS BEPRESS,NA +journal of food and nutrition research,1336-8672,1338-4260,NA,0,0,1,0,Food Science & Technology,NA,NA,"VUP FOOD RESEARCH INST, BRATISLAVA",NA +journal of food biochemistry,0145-8884,1745-4514,NA,0,0,1,0,Biochemistry & Molecular Biology | Food Science & Technology,NA,NA,WILEY,NA +journal of food composition and analysis,0889-1575,1096-0481,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of food engineering,0260-8774,1873-5770,NA,0,0,1,0,"Engineering, Chemical | Food Science & Technology",NA,NA,ELSEVIER SCI LTD,NA +journal of food measurement and characterization,2193-4126,2193-4134,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER,NA +journal of food process engineering,0145-8876,1745-4530,NA,0,0,1,0,"Engineering, Chemical | Food Science & Technology",NA,NA,WILEY,NA +journal of food processing and preservation,0145-8892,1745-4549,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +journal of food protection,0362-028X,1944-9097,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology,NA,NA,INT ASSOC FOOD PROTECTION,NA +journal of food quality,0146-9428,1745-4557,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY-HINDAWI,NA +journal of food safety,0149-6085,1745-4565,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology,NA,NA,WILEY,NA +journal of food safety and food quality-archiv fur lebensmittelhygiene,0003-925X,NA,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology | Toxicology",NA,NA,M H SCHAPER GMBH CO KG,NA +journal of food science,0022-1147,1750-3841,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +journal of food science and technology-mysore,0022-1155,0975-8402,NA,0,0,1,0,Food Science & Technology,NA,NA,SPRINGER INDIA,NA +journal of foot & ankle surgery,1067-2516,1542-2224,NA,0,0,1,0,Orthopedics | Surgery,NA,NA,ELSEVIER SCIENCE INC,NA +journal of foot and ankle research,1757-1146,1757-1146,jfootankleres,0,0,1,1,Orthopedics,NA,NA,BMC,2015-09-07 +journal of foraminiferal research,0096-1191,NA,NA,0,0,1,0,Paleontology,NA,NA,CUSHMAN FOUNDATION FORAMINIFERAL RESEARCH,NA +journal of forecasting,0277-6693,1099-131X,NA,0,1,0,0,NA,Economics | Management,NA,WILEY,NA +journal of forensic and legal medicine,1752-928X,1532-2009,NA,0,0,1,0,"Medicine, Legal",NA,NA,ELSEVIER SCI LTD,NA +journal of forensic nursing,1556-3693,1939-3938,NA,0,1,1,0,Nursing,Nursing | Criminology & Penology,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of forensic nursing,1556-3693,1939-3938,NA,0,1,1,0,Nursing,Nursing | Criminology & Penology,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of forensic psychiatry & psychology,1478-9949,1478-9957,JFoPsychPsychol,0,1,0,1,NA,Criminology & Penology | Psychiatry,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-02-27 +journal of forensic psychology research and practice,2473-2850,2473-2842,NA,0,1,0,0,NA,"Criminology & Penology | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of forensic sciences,0022-1198,1556-4029,NA,0,0,1,0,"Medicine, Legal",NA,NA,WILEY,NA +journal of forest economics,1104-6899,1618-1530,NA,0,1,1,0,Forestry,Economics,NA,NOW PUBLISHERS INC,NA +journal of forest economics,1104-6899,1618-1530,NA,0,1,1,0,Forestry,Economics,NA,NOW PUBLISHERS INC,NA +journal of forest research,1341-6979,1610-7403,NA,0,0,1,0,Forestry,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of forestry,0022-1201,1938-3746,NA,0,0,1,0,Forestry,NA,NA,OXFORD UNIV PRESS INC,NA +journal of forestry research,1007-662X,1993-0607,JournalForestry,0,0,1,1,Forestry,NA,NA,NORTHEAST FORESTRY UNIV,2020-12-08 +journal of fourier analysis and applications,1069-5869,1531-5851,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER BIRKHAUSER,NA +journal of fractal geometry,2308-1309,2308-1317,NA,0,0,1,0,Mathematics,NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +journal of french language studies,0959-2695,1474-0079,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +journal of french language studies,0959-2695,1474-0079,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +journal of freshwater ecology,0270-5060,2156-6941,NA,0,0,1,0,Ecology | Limnology,NA,NA,TAYLOR & FRANCIS INC,NA +journal of friction and wear,1068-3666,1934-9386,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,PLEIADES PUBLISHING INC,NA +journal of function spaces,2314-8896,2314-8888,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,HINDAWI LTD,NA +journal of functional analysis,0022-1236,1096-0783,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of functional foods,1756-4646,2214-9414,NA,0,0,1,0,Food Science & Technology | Nutrition & Dietetics,NA,NA,ELSEVIER,NA +journal of functional programming,0956-7968,1469-7653,CUP_JFP,0,0,1,1,"Computer Science, Software Engineering",NA,NA,CAMBRIDGE UNIV PRESS,2017-09-15 +journal of fungi,2309-608X,2309-608X,JoF_MDPI,0,0,1,1,Microbiology | Mycology,NA,NA,MDPI,2017-01-05 +journal of fusion energy,0164-0313,1572-9591,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,SPRINGER,NA +journal of futures markets,0270-7314,1096-9934,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +journal of gambling studies,1050-5350,1573-3602,NA,0,1,0,0,NA,"Substance Abuse | Psychology, Multidisciplinary",NA,SPRINGER,NA +journal of gastric cancer,2093-582X,2093-5641,NA,0,0,1,0,Oncology | Gastroenterology & Hepatology,NA,NA,KOREAN GASTRIC CANCER ASSOC,NA +journal of gastroenterology,0944-1174,1435-5922,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,SPRINGER JAPAN KK,NA +journal of gastroenterology and hepatology,0815-9319,1440-1746,JGH_latest,0,0,1,1,Gastroenterology & Hepatology,NA,NA,WILEY,2018-08-10 +journal of gastrointestinal and liver diseases,1841-8724,1842-1121,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,MEDICAL UNIV PRESS,NA +journal of gastrointestinal oncology,2078-6891,2219-679X,NA,0,0,1,0,Oncology | Gastroenterology & Hepatology,NA,NA,AME PUBL CO,NA +journal of gastrointestinal surgery,1091-255X,1873-4626,JournalofGISurg,0,0,1,1,Gastroenterology & Hepatology | Surgery,NA,NA,SPRINGER,2017-01-31 +journal of gemmology,1355-4565,2632-1718,NA,0,0,1,0,Mineralogy,NA,NA,GEMMOLOGICAL ASSOC GREAT BRITAIN,NA +journal of gender studies,0958-9236,1465-3869,Gender_Journal,0,1,0,1,NA,"Social Issues | Social Sciences, Interdisciplinary | Women'S Studies",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-07-10 +journal of gene medicine,1099-498X,1521-2254,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Genetics & Heredity | Medicine, Research & Experimental",NA,NA,WILEY,NA +journal of general and applied microbiology,0022-1260,1349-8037,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,MICROBIOL RES FOUNDATION,NA +journal of general internal medicine,0884-8734,1525-1497,JournalGIM,0,0,1,1,"Health Care Sciences & Services | Medicine, General & Internal",NA,NA,SPRINGER,2012-04-13 +journal of general physiology,0022-1295,1540-7748,JGenPhysiol,0,0,1,1,Physiology,NA,NA,ROCKEFELLER UNIV PRESS,2009-09-18 +journal of general plant pathology,1345-2630,1610-739X,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER JAPAN KK,NA +journal of general psychology,0022-1309,1940-0888,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of general virology,0022-1317,1465-2099,NA,0,0,1,0,Biotechnology & Applied Microbiology | Virology,NA,NA,MICROBIOLOGY SOC,NA +journal of genetic counseling,1059-7700,1573-3599,NA,0,1,1,0,Genetics & Heredity,"Health Policy & Services | Social Sciences, Biomedical",NA,WILEY,NA +journal of genetic counseling,1059-7700,1573-3599,NA,0,1,1,0,Genetics & Heredity,"Health Policy & Services | Social Sciences, Biomedical",NA,WILEY,NA +journal of genetic psychology,0022-1325,1940-0896,J_GeneticPsych,0,1,1,1,Psychology,"Psychology, Development | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-09-14 +journal of genetic psychology,0022-1325,1940-0896,J_GeneticPsych,0,1,1,1,Psychology,"Psychology, Development | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-09-14 +journal of genetics,0022-1333,0973-7731,NA,0,0,1,0,Genetics & Heredity,NA,NA,INDIAN ACAD SCIENCES,NA +journal of genetics and genomics,1673-8527,1873-5533,JGenetGenomics,0,0,1,1,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,SCIENCE PRESS,2021-12-26 +journal of geochemical exploration,0375-6742,1879-1689,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,ELSEVIER,NA +journal of geodesy,0949-7714,1432-1394,NA,0,0,1,0,Geochemistry & Geophysics | Remote Sensing,NA,NA,SPRINGER,NA +journal of geodynamics,0264-3707,NA,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of geographical sciences,1009-637X,1861-9568,NA,0,0,1,0,"Geography, Physical",NA,NA,SCIENCE PRESS,NA +journal of geographical systems,1435-5930,1435-5949,jgeosys,0,1,0,1,NA,Geography,NA,SPRINGER HEIDELBERG,2019-07-23 +journal of geography,0022-1341,1752-6868,JGEO_IU,0,1,0,1,NA,Geography,NA,TAYLOR & FRANCIS INC,2021-01-01 +journal of geography in higher education,0309-8265,1466-1845,jghe_journal,0,1,0,1,NA,Education & Educational Research | Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-10-13 +journal of geology,0022-1376,1537-5269,NA,0,0,1,0,Geology,NA,NA,UNIV CHICAGO PRESS,NA +journal of geometric analysis,1050-6926,1559-002X,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +journal of geometric mechanics,1941-4889,1941-4897,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +journal of geometry and physics,0393-0440,1879-1662,NA,0,0,1,0,"Mathematics | Physics, Mathematical",NA,NA,ELSEVIER,NA +journal of geophysical research-atmospheres,2169-897X,2169-8996,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,AMER GEOPHYSICAL UNION,NA +journal of geophysical research-biogeosciences,2169-8953,2169-8961,JGRBiogeo,0,0,1,1,"Environmental Sciences | Geosciences, Multidisciplinary",NA,NA,AMER GEOPHYSICAL UNION,2019-01-18 +journal of geophysical research-earth surface,2169-9003,2169-9011,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,AMER GEOPHYSICAL UNION,NA +journal of geophysical research-oceans,2169-9275,2169-9291,NA,0,0,1,0,Oceanography,NA,NA,AMER GEOPHYSICAL UNION,NA +journal of geophysical research-planets,2169-9097,2169-9100,jgrplanets,0,0,1,1,Geochemistry & Geophysics,NA,NA,AMER GEOPHYSICAL UNION,2014-08-05 +journal of geophysical research-solid earth,2169-9313,2169-9356,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,AMER GEOPHYSICAL UNION,NA +journal of geophysical research-space physics,2169-9380,2169-9402,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,AMER GEOPHYSICAL UNION,NA +journal of geophysics and engineering,1742-2132,1742-2140,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,OXFORD UNIV PRESS,NA +journal of geosciences,1802-6222,1803-1943,jgeosci,0,0,1,1,Geochemistry & Geophysics | Mineralogy,NA,NA,CESKA GEOLOGICKA SPOLECNOST,2011-02-11 +journal of geotechnical and geoenvironmental engineering,1090-0241,1943-5606,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of geriatric cardiology,1671-5411,NA,NA,0,0,1,0,Cardiac & Cardiovascular System | Geriatrics & Gerontology,NA,NA,SCIENCE PRESS,NA +journal of geriatric oncology,1879-4068,1879-4076,JGeriOnc,0,0,1,1,Oncology | Geriatrics & Gerontology,NA,NA,ELSEVIER,2018-11-27 +journal of geriatric physical therapy,1539-8412,2152-0895,JGPTonline,0,0,1,1,Geriatrics & Gerontology | Rehabilitation,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-23 +journal of geriatric psychiatry and neurology,0891-9887,1552-5708,NA,0,0,1,0,Geriatrics & Gerontology | Clinical Neurology | Psychiatry,NA,NA,SAGE PUBLICATIONS INC,NA +journal of germanic linguistics,1470-5427,1475-3014,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +journal of germanic linguistics,1470-5427,1475-3014,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +journal of gerontological nursing,0098-9134,1938-243X,NA,0,1,1,0,Geriatrics & Gerontology | Nursing,Nursing | Gerontology,NA,SLACK INC,NA +journal of gerontological nursing,0098-9134,1938-243X,NA,0,1,1,0,Geriatrics & Gerontology | Nursing,Nursing | Gerontology,NA,SLACK INC,NA +journal of gerontological social work,1540-4048,0163-4372,NA,0,1,0,0,NA,Gerontology | Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of ginseng research,1226-8453,2093-4947,NA,0,0,1,0,"Chemistry, Medicinal | Integrative & Complementary Medicine",NA,NA,KOREAN SOC GINSENG,NA +journal of glaciology,0022-1430,1727-5652,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of glass studies,0075-4250,NA,NA,1,0,0,0,NA,NA,Art,CORNING MUSEUM GLASS,NA +journal of glaucoma,1057-0829,1536-481X,JOGJournal,0,0,1,1,Ophthalmology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-05-31 +journal of global antimicrobial resistance,2213-7165,2213-7173,NA,0,0,1,0,Infectious Diseases | Pharmacology & Pharmacy,NA,NA,ELSEVIER SCI LTD,NA +journal of global health,2047-2978,2047-2986,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,INT SOC GLOBAL HEALTH,NA +journal of global health,2047-2978,2047-2986,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,INT SOC GLOBAL HEALTH,NA +journal of global history,1740-0228,1740-0236,globalhistjnl,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2019-05-17 +journal of global history,1740-0228,1740-0236,globalhistjnl,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2019-05-17 +journal of global information management,1062-7375,1533-7995,NA,0,1,0,0,NA,Information Science & Library Science,NA,IGI GLOBAL,NA +journal of global information technology management,1097-198X,2333-6846,NA,0,1,0,0,NA,Information Science & Library Science,NA,TAYLOR & FRANCIS INC,NA +journal of global optimization,0925-5001,1573-2916,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,SPRINGER,NA +journal of graph theory,0364-9024,1097-0118,NA,0,0,1,0,Mathematics,NA,NA,WILEY,NA +journal of great lakes research,0380-1330,0380-1330,NA,0,0,1,0,Environmental Sciences | Limnology | Marine & Freshwater Biology,NA,NA,ELSEVIER SCI LTD,NA +journal of green building,1552-6100,1943-4618,NA,1,0,0,0,NA,NA,Architecture,COLLEGE PUBLISHING,NA +journal of grey system,0957-3720,NA,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications",NA,NA,RESEARCH INFORMATION LTD,NA +journal of grid computing,1570-7873,1572-9184,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +journal of group theory,1433-5883,1435-4446,NA,0,0,1,0,Mathematics,NA,NA,WALTER DE GRUYTER GMBH,NA +journal of guidance control and dynamics,0731-5090,1533-3884,NA,0,0,1,0,"Engineering, Aerospace | Instruments & Instrumentation",NA,NA,AMER INST AERONAUTICS ASTRONAUTICS,NA +journal of gynecologic oncology,2005-0380,2005-0399,jgo_journal,0,0,1,1,Oncology | Obstetrics & Gynecology,NA,NA,KOREAN SOC GYNECOLOGY ONCOLOGY & COLPOSCOPY,2021-07-05 +journal of gynecology obstetrics and human reproduction,2468-7847,1773-0430,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",NA +journal of hand surgery-american volume,0363-5023,1531-6564,JHandSurg,0,0,1,1,Orthopedics | Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2014-06-19 +journal of hand surgery-european volume,1753-1934,2043-6289,NA,0,0,1,0,Orthopedics | Surgery,NA,NA,SAGE PUBLICATIONS LTD,NA +journal of hand therapy,0894-1130,1545-004X,JrnlHandTherapy,0,0,1,1,Orthopedics | Rehabilitation | Surgery,NA,NA,HANLEY & BELFUS-ELSEVIER INC,2021-06-21 +journal of happiness studies,1389-4978,1573-7780,NA,0,1,0,0,NA,"Psychology, Multidisciplinary | Social Sciences, Interdisciplinary",NA,SPRINGER,NA +journal of hard tissue biology,1341-7649,1341-7649,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,JOURNAL HARD TISSUE BIOLOGY,NA +journal of hazardous materials,0304-3894,1873-3336,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,ELSEVIER,NA +journal of head trauma rehabilitation,0885-9701,1550-509X,NA,0,1,1,0,Clinical Neurology | Rehabilitation,Rehabilitation,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of head trauma rehabilitation,0885-9701,1550-509X,NA,0,1,1,0,Clinical Neurology | Rehabilitation,Rehabilitation,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of headache and pain,1129-2369,1129-2377,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,BMC,NA +journal of health and social behavior,0022-1465,2150-6000,jofhsb,0,1,0,1,NA,"Public, Environmental & Occupational Health | Psychology, Social | Social Sciences, Biomedical | Sociology",NA,SAGE PUBLICATIONS INC,2011-01-25 +journal of health care for the poor and underserved,1049-2089,1548-6869,NA,0,1,0,0,NA,"Health Policy & Services | Public, Environmental & Occupational Health",NA,JOHNS HOPKINS UNIV PRESS,NA +journal of health communication,1081-0730,1087-0415,NA,0,1,0,0,NA,Communication | Information Science & Library Science,NA,TAYLOR & FRANCIS INC,NA +journal of health economics,0167-6296,1879-1646,JHealthEcon,0,1,1,1,Health Care Sciences & Services,Economics | Health Policy & Services,NA,ELSEVIER,2018-07-05 +journal of health economics,0167-6296,1879-1646,JHealthEcon,0,1,1,1,Health Care Sciences & Services,Economics | Health Policy & Services,NA,ELSEVIER,2018-07-05 +journal of health organization and management,1477-7266,1758-7247,NA,0,1,0,0,NA,Health Policy & Services,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of health politics policy and law,0361-6878,1527-1927,JHPPL,0,1,1,1,"Health Care Sciences & Services | Medicine, Legal","Health Policy & Services | Social Issues | Social Sciences, Biomedical",NA,DUKE UNIV PRESS,2013-09-03 +journal of health politics policy and law,0361-6878,1527-1927,JHPPL,0,1,1,1,"Health Care Sciences & Services | Medicine, Legal","Health Policy & Services | Social Issues | Social Sciences, Biomedical",NA,DUKE UNIV PRESS,2013-09-03 +journal of health population and nutrition,1606-0997,2072-1315,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,BMC,NA +journal of health psychology,1359-1053,1461-7277,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SAGE PUBLICATIONS LTD,NA +journal of health services research & policy,1355-8196,1758-1060,NA,0,1,0,0,NA,Health Policy & Services,NA,SAGE PUBLICATIONS INC,NA +journal of healthcare engineering,2040-2295,2040-2309,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,HINDAWI LTD,NA +journal of healthcare management,1096-9012,1944-7396,NA,0,1,0,0,NA,Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of heart and lung transplantation,1053-2498,1557-3117,TheJHLT,0,0,1,1,Cardiac & Cardiovascular System | Respiratory System | Surgery | Transplantation,NA,NA,ELSEVIER SCIENCE INC,2015-05-24 +journal of heat transfer-transactions of the asme,0022-1481,1528-8943,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,ASME,NA +journal of hellenic studies,0075-4269,2041-4099,NA,1,0,0,0,NA,NA,Classics,CAMBRIDGE UNIV PRESS,NA +journal of helminthology,0022-149X,1475-2697,JHelminthology,0,0,1,1,Parasitology | Zoology,NA,NA,CAMBRIDGE UNIV PRESS,2019-02-19 +journal of hematology & oncology,1756-8722,1756-8722,NA,0,0,1,0,Oncology | Hematology,NA,NA,BMC,NA +journal of hematopathology,1868-9256,1865-5785,NA,0,0,1,0,Hematology | Pathology,NA,NA,SPRINGER HEIDELBERG,NA +journal of hepato-biliary-pancreatic sciences,1868-6974,1868-6982,NA,0,0,1,0,Gastroenterology & Hepatology | Surgery,NA,NA,WILEY,NA +journal of hepatocellular carcinoma,2253-5969,2253-5969,NA,0,0,1,0,Oncology,NA,NA,DOVE MEDICAL PRESS LTD,NA +journal of hepatology,0168-8278,1600-0641,JHepatology,0,0,1,1,Gastroenterology & Hepatology,NA,NA,ELSEVIER,2012-10-05 +journal of herbal medicine,2210-8033,2210-8041,JHerbMed,0,0,1,1,Integrative & Complementary Medicine,NA,NA,ELSEVIER GMBH,2019-11-16 +journal of heredity,0022-1503,1465-7333,NA,0,0,1,0,Evolutionary Biology | Genetics & Heredity,NA,NA,OXFORD UNIV PRESS INC,NA +journal of herpetology,0022-1511,1937-2418,JofHerp,0,0,1,1,Zoology,NA,NA,SOC STUDY AMPHIBIANS REPTILES,2015-03-16 +journal of heterocyclic chemistry,0022-152X,1943-5193,NA,0,0,1,0,"Chemistry, Organic",NA,NA,WILEY,NA +journal of heuristics,1381-1231,1572-9397,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +journal of high energy astrophysics,2214-4048,2214-4056,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,ELSEVIER,NA +journal of high energy physics,1029-8479,1029-8479,NA,0,0,1,0,"Physics, Particles & Fields",NA,NA,SPRINGER,NA +journal of higher education,0022-1546,1538-4640,JHE_Editors,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-01-22 +journal of higher education policy and management,1360-080X,1469-9508,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of hip preservation surgery,2054-8397,2054-8397,NA,0,0,1,0,Orthopedics,NA,NA,OXFORD UNIV PRESS,NA +journal of histochemistry & cytochemistry,0022-1554,1551-5044,JHCnews,0,0,1,1,Cell Biology,NA,NA,SAGE PUBLICATIONS LTD,2012-06-01 +journal of historical geography,0305-7488,1095-8614,jofhistgeog,0,1,0,1,NA,Geography | History Of Social Sciences,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,2016-03-11 +journal of historical pragmatics,1566-5852,1569-9854,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +journal of historical pragmatics,1566-5852,1569-9854,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +journal of historical sociology,0952-1909,1467-6443,NA,0,1,0,0,NA,Anthropology | History | Sociology,NA,WILEY,NA +journal of histotechnology,0147-8885,2046-0236,NA,0,0,1,0,Cell Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of holy land and palestine studies,2054-1988,2054-1996,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",EDINBURGH UNIV PRESS,NA +journal of homeland security and emergency management,2194-6361,1547-7355,NA,0,1,0,0,NA,Public Administration,NA,WALTER DE GRUYTER GMBH,NA +journal of homosexuality,0091-8369,1540-3602,NA,0,1,0,0,NA,"Psychology, Multidisciplinary | Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of homotopy and related structures,2193-8407,1512-2891,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +journal of horticultural science & biotechnology,1462-0316,2380-4084,NA,0,0,1,0,Horticulture,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of hospice & palliative nursing,1522-2179,1539-0705,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of hospice & palliative nursing,1522-2179,1539-0705,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of hospital infection,0195-6701,1532-2939,jhieditor,0,0,1,1,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,W B SAUNDERS CO LTD,2013-11-06 +journal of hospital medicine,1553-5592,1553-5606,JHospMedicine,0,0,1,1,"Medicine, General & Internal",NA,NA,FRONTLINE MEDICAL COMMUNICATIONS,2011-11-14 +journal of hospitality & tourism research,1096-3480,1557-7554,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,SAGE PUBLICATIONS INC,NA +journal of hospitality and tourism management,1447-6770,1839-5260,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Management",NA,ELSEVIER,NA +journal of hospitality and tourism technology,1757-9880,1757-9899,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,EMERALD GROUP PUBLISHING LTD,NA +journal of hospitality leisure sport & tourism education,1473-8376,1473-8376,NA,0,1,0,0,NA,"Education & Educational Research | Hospitality, Leisure, Sport & Tourism",NA,ELSEVIER SCI LTD,NA +journal of hospitality marketing & management,1936-8623,1936-8631,JhmmTfg,0,1,0,1,NA,"Business | Hospitality, Leisure, Sport & Tourism | Management",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-17 +journal of housing and the built environment,1566-4910,1573-7772,NA,0,1,0,0,NA,Environmental Studies | Regional & Urban Planning | Urban Studies,NA,SPRINGER,NA +journal of housing economics,1051-1377,1096-0791,NA,0,1,0,0,NA,Economics | Urban Studies,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of human capital,1932-8575,1932-8664,NA,0,1,0,0,NA,Economics,NA,UNIV CHICAGO PRESS,NA +journal of human development and capabilities,1945-2829,1945-2837,NA,0,1,0,0,NA,Development Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of human evolution,0047-2484,1095-8606,NA,0,1,1,0,Evolutionary Biology,Anthropology,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of human evolution,0047-2484,1095-8606,NA,0,1,1,0,Evolutionary Biology,Anthropology,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of human genetics,1434-5161,1435-232X,NA,0,0,1,0,Genetics & Heredity,NA,NA,SPRINGERNATURE,NA +journal of human hypertension,0950-9240,1476-5527,JHHypertension,0,0,1,1,Peripheral Vascular Diseases,NA,NA,SPRINGERNATURE,2018-04-15 +journal of human kinetics,1640-5544,1899-7562,NA,0,0,1,0,Sport Sciences,NA,NA,SCIENDO,NA +journal of human lactation,0890-3344,1552-5732,JHL_Lactation,0,0,1,1,Nursing | Obstetrics & Gynecology | Pediatrics,NA,NA,SAGE PUBLICATIONS INC,2019-10-17 +journal of human nutrition and dietetics,0952-3871,1365-277X,JHNDEditor,0,0,1,1,Nutrition & Dietetics,NA,NA,WILEY,2013-01-28 +journal of human resources,0022-166X,1548-8004,J_HumanResource,0,1,0,1,NA,Economics | Industrial Relations & Labor,NA,UNIV WISCONSIN PRESS,2017-02-08 +journal of human rights,1475-4835,1475-4843,jofhumanrights,0,1,0,1,NA,International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-05-12 +journal of humanistic psychology,0022-1678,1552-650X,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +journal of hydraulic engineering,0733-9429,1943-7900,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical | Water Resources",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of hydraulic research,0022-1686,1814-2079,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of hydro-environment research,1570-6443,1876-4444,NA,0,0,1,0,"Engineering, Civil | Environmental Sciences | Water Resources",NA,NA,ELSEVIER,NA +journal of hydrodynamics,1001-6058,1878-0342,NA,0,0,1,0,Mechanics,NA,NA,SPRINGER,NA +journal of hydroinformatics,1464-7141,1465-1734,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Civil | Environmental Sciences | Water Resources",NA,NA,IWA PUBLISHING,NA +journal of hydrologic engineering,1084-0699,1943-5584,NA,0,0,1,0,"Engineering, Civil | Environmental Sciences | Water Resources",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of hydrology,0022-1694,1879-2707,NA,0,0,1,0,"Engineering, Civil | Geosciences, Multidisciplinary | Water Resources",NA,NA,ELSEVIER,NA +journal of hydrology-regional studies,2214-5818,2214-5818,NA,0,0,1,0,Water Resources,NA,NA,ELSEVIER,NA +journal of hydrology and hydromechanics,0042-790X,1338-4333,NA,0,0,1,0,Water Resources,NA,NA,SCIENDO,NA +journal of hydrometeorology,1525-755X,1525-7541,AMS_JHM,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,AMER METEOROLOGICAL SOC,2020-10-02 +journal of hymenoptera research,1070-9428,1314-2607,NA,0,0,1,0,Entomology,NA,NA,PENSOFT PUBLISHERS,NA +journal of hyperbolic differential equations,0219-8916,1793-6993,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of hypertension,0263-6352,1473-5598,JHypertension,0,0,1,1,Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-12-15 +journal of iberian geology,1698-6180,1886-7995,NA,0,0,1,0,Geology,NA,NA,SPRINGER INT PUBL AG,NA +journal of ichthyology,0032-9452,1555-6425,NA,0,0,1,0,Fisheries | Zoology,NA,NA,PLEIADES PUBLISHING INC,NA +journal of imaging science and technology,1062-3701,1943-3522,NA,0,0,1,0,Imaging Science & Photographic Technology,NA,NA,I S & T-SOC IMAGING SCIENCE TECHNOLOGY,NA +journal of immigrant & refugee studies,1556-2948,1556-2956,NA,0,1,0,0,NA,Demography | Ethnic Studies | Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of immigrant and minority health,1557-1912,1557-1920,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SPRINGER,NA +journal of immunological methods,0022-1759,1872-7905,NA,0,0,1,0,Biochemical Research Methods | Immunology,NA,NA,ELSEVIER,NA +journal of immunology,0022-1767,1550-6606,J_Immunol,0,0,1,1,Immunology,NA,NA,AMER ASSOC IMMUNOLOGISTS,2015-10-16 +journal of immunology research,2314-8861,2314-7156,NA,0,0,1,0,Immunology,NA,NA,HINDAWI LTD,NA +journal of immunotherapy,1524-9557,1537-4513,NA,0,0,1,0,"Oncology | Immunology | Medicine, Research & Experimental",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of immunotoxicology,1547-691X,1547-6901,NA,0,0,1,0,Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of imperial and commonwealth history,0308-6534,1743-9329,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of inclusion phenomena and macrocyclic chemistry,1388-3127,1573-1111,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER,NA +journal of indian philosophy,0022-1791,1573-0395,NA,1,0,0,0,NA,NA,Philosophy | Asian Studies,SPRINGER,NA +journal of individual differences,1614-0001,2151-2299,NA,0,1,0,0,NA,"Psychology, Social",NA,HOGREFE PUBLISHING CORP,NA +journal of indo-european studies,0092-2323,0092-2323,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",INST STUDY MAN,NA +journal of industrial and engineering chemistry,1226-086X,1876-794X,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,ELSEVIER SCIENCE INC,NA +journal of industrial and management optimization,1547-5816,1553-166X,NA,0,0,1,0,"Engineering, Multidisciplinary | Operations Research & Management Science | Mathematics, Interdisciplinary Applications",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +journal of industrial ecology,1088-1980,1530-9290,JIndEcol,0,0,1,1,"Green & Sustainable Science & Technology | Engineering, Environmental | Environmental Sciences",NA,NA,WILEY,2013-03-08 +journal of industrial economics,0022-1821,1467-6451,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,WILEY,NA +journal of industrial information integration,2467-964X,2452-414X,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Industrial",NA,NA,ELSEVIER,NA +journal of industrial microbiology & biotechnology,1367-5435,1476-5535,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,OXFORD UNIV PRESS,NA +journal of industrial relations,0022-1856,1472-9296,JIRjournal,0,1,0,1,NA,Industrial Relations & Labor,NA,SAGE PUBLICATIONS INC,2022-01-04 +journal of industrial textiles,1528-0837,1530-8057,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,SAGE PUBLICATIONS INC,NA +journal of inequalities and applications,1029-242X,1029-242X,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER,NA +journal of infection,0163-4453,1532-2742,NA,0,0,1,0,Infectious Diseases,NA,NA,W B SAUNDERS CO LTD,NA +journal of infection and chemotherapy,1341-321X,1437-7780,NA,0,0,1,0,Infectious Diseases | Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +journal of infection and public health,1876-0341,1876-035X,JIPH_Journal,0,0,1,1,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,ELSEVIER SCIENCE LONDON,2018-05-13 +journal of infection in developing countries,1972-2680,1972-2680,jidc,0,0,1,1,Infectious Diseases,NA,NA,J INFECTION DEVELOPING COUNTRIES,2009-05-22 +journal of infectious diseases,0022-1899,1537-6613,JIDJournal,0,0,1,1,Immunology | Infectious Diseases | Microbiology,NA,NA,OXFORD UNIV PRESS INC,2022-02-25 +journal of inflammation-london,1476-9255,1476-9255,NA,0,0,1,0,Immunology,NA,NA,BMC,NA +journal of inflammation research,1178-7031,1178-7031,NA,0,0,1,0,Immunology,NA,NA,DOVE MEDICAL PRESS LTD,NA +journal of information display,1598-0316,2158-1606,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of information science,0165-5515,1741-6485,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,SAGE PUBLICATIONS LTD,NA +journal of information science,0165-5515,1741-6485,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,SAGE PUBLICATIONS LTD,NA +journal of information science and engineering,1016-2364,NA,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,INST INFORMATION SCIENCE,NA +journal of information security and applications,2214-2126,2214-2134,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,ELSEVIER,NA +journal of information systems,0888-7985,1558-7959,NA,0,1,0,0,NA,"Business, Finance",NA,AMER ACCOUNTING ASSOC,NA +journal of information technology,0268-3962,1466-4437,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,SAGE PUBLICATIONS LTD,NA +journal of information technology,0268-3962,1466-4437,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,SAGE PUBLICATIONS LTD,NA +journal of information technology & politics,1933-1681,1933-169X,jitp_apsa,0,1,0,1,NA,Communication | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-05-22 +journal of informetrics,1751-1577,1875-5879,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications",Information Science & Library Science,NA,ELSEVIER,NA +journal of informetrics,1751-1577,1875-5879,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications",Information Science & Library Science,NA,ELSEVIER,NA +journal of infrared and millimeter waves,1001-9014,NA,NA,0,0,1,0,Optics,NA,NA,SCIENCE PRESS,NA +journal of infrared millimeter and terahertz waves,1866-6892,1866-6906,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Physics, Applied",NA,NA,SPRINGER,NA +journal of infrastructure systems,1076-0342,1943-555X,NA,0,0,1,0,"Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of inherited metabolic disease,0141-8955,1573-2665,JIMD_Editors,0,0,1,1,"Endocrinology & Metabolism | Genetics & Heredity | Medicine, Research & Experimental",NA,NA,WILEY,2016-03-10 +journal of innate immunity,1662-811X,1662-8128,NA,0,0,1,0,Immunology,NA,NA,KARGER,NA +journal of innovation & knowledge,2530-7614,2444-569X,NA,0,1,0,0,NA,Business | Management,NA,ELSEVIER ESPANA,NA +journal of innovative optical health sciences,1793-5458,1793-7205,NA,0,0,1,0,"Optics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of inorganic and organometallic polymers and materials,1574-1443,1574-1451,NA,0,0,1,0,Polymer Science,NA,NA,SPRINGER,NA +journal of inorganic biochemistry,0162-0134,1873-3344,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Inorganic & Nuclear",NA,NA,ELSEVIER SCIENCE INC,NA +journal of inorganic materials,1000-324X,NA,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,SCIENCE PRESS,NA +journal of insect behavior,0892-7553,1572-8889,NA,0,0,1,0,Entomology,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of insect conservation,1366-638X,1572-9753,NA,0,0,1,0,Entomology,NA,NA,SPRINGER,NA +journal of insect physiology,0022-1910,1879-1611,NA,0,0,1,0,Entomology | Physiology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of insect science,1536-2442,1536-2442,NA,0,0,1,0,Entomology,NA,NA,OXFORD UNIV PRESS INC,NA +journal of insects as food and feed,NA,2352-4588,InsectsFoodFeed,0,0,1,1,Entomology | Food Science & Technology,NA,NA,WAGENINGEN ACADEMIC PUBLISHERS,2014-04-11 +journal of institutional and theoretical economics-zeitschrift fur die gesamte staatswissenschaft,0932-4569,1614-0559,NA,0,1,0,0,NA,Economics,NA,J C B MOHR,NA +journal of institutional economics,1744-1374,1744-1382,NA,0,1,0,0,NA,Economics,NA,CAMBRIDGE UNIV PRESS,NA +journal of instrumentation,1748-0221,1748-0221,NA,0,0,1,0,Instruments & Instrumentation,NA,NA,IOP PUBLISHING LTD,NA +journal of integral equations and applications,0897-3962,1938-2626,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ROCKY MT MATH CONSORTIUM,NA +journal of integrated pest management,2155-7470,2155-7470,NA,0,0,1,0,Entomology,NA,NA,OXFORD UNIV PRESS INC,NA +journal of integrative agriculture,2095-3119,2352-3425,JIA_JIntegrAgri,0,0,1,1,"Agriculture, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,2018-02-06 +journal of integrative environmental sciences,1943-815X,1943-8168,NA,0,0,1,0,Environmental Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of integrative medicine-jim,2095-4964,2095-4964,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,ELSEVIER,NA +journal of integrative neuroscience,0219-6352,1757-448X,JINeuroscience,0,0,1,1,Neurosciences,NA,NA,IMR PRESS,2019-02-28 +journal of integrative plant biology,1672-9072,1744-7909,JIPBio,0,0,1,1,Biochemistry & Molecular Biology | Plant Sciences,NA,NA,WILEY,2019-04-23 +journal of intellectual & developmental disability,1366-8250,1469-9532,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of intellectual capital,1469-1930,1758-7468,journal_capital,0,1,0,1,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,2020-09-25 +journal of intellectual disabilities,1744-6295,1744-6309,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SAGE PUBLICATIONS LTD,NA +journal of intellectual disability research,0964-2633,1365-2788,JIDR_Wiley,0,1,0,1,NA,"Education, Special | Rehabilitation",NA,WILEY,2014-04-02 +journal of intelligence,2079-3200,2079-3200,Jintelligence1,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,MDPI,2017-01-16 +journal of intelligent & fuzzy systems,1064-1246,1875-8967,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,IOS PRESS,NA +journal of intelligent & robotic systems,0921-0296,1573-0409,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Robotics",NA,NA,SPRINGER,NA +journal of intelligent information systems,0925-9902,1573-7675,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,SPRINGER,NA +journal of intelligent manufacturing,0956-5515,1572-8145,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Manufacturing",NA,NA,SPRINGER,NA +journal of intelligent material systems and structures,1045-389X,1530-8138,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of intelligent transportation systems,1547-2450,1547-2442,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,TAYLOR & FRANCIS INC,NA +journal of intelligent transportation systems,1547-2450,1547-2442,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,TAYLOR & FRANCIS INC,NA +journal of intensive care,2052-0492,2052-0492,NA,0,0,1,0,Critical Care Medicine,NA,NA,BMC,NA +journal of intensive care medicine,0885-0666,1525-1489,NA,0,0,1,0,Critical Care Medicine,NA,NA,SAGE PUBLICATIONS INC,NA +journal of interactive marketing,1094-9968,1520-6653,JofInteractive,0,1,0,1,NA,Business,NA,ELSEVIER SCIENCE INC,2020-01-31 +journal of interdisciplinary history,0022-1953,1530-9169,NA,1,1,0,0,NA,History,History,MIT PRESS,NA +journal of interdisciplinary history,0022-1953,1530-9169,NA,1,1,0,0,NA,History,History,MIT PRESS,NA +journal of interferon and cytokine research,1079-9907,1557-7465,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology | Immunology,NA,NA,"MARY ANN LIEBERT, INC",NA +journal of interior design,1071-7641,1939-1668,NA,1,0,0,0,NA,NA,Architecture,"WILEY PERIODICALS, INC",NA +journal of internal medicine,0954-6820,1365-2796,JInternMed,0,0,1,1,"Medicine, General & Internal",NA,NA,WILEY,2012-11-08 +journal of international advanced otology,1308-7649,2148-3817,NA,0,0,1,0,Otorhinolaryngology,NA,NA,AVES,NA +journal of international business studies,0047-2506,1478-6990,JIBSupdates,0,1,0,1,NA,Business | Management,NA,PALGRAVE MACMILLAN LTD,2009-07-16 +journal of international criminal justice,1478-1387,1478-1395,NA,0,1,0,0,NA,Law,NA,OXFORD UNIV PRESS,NA +journal of international development,0954-1748,1099-1328,JID_journal,0,1,0,1,NA,Development Studies,NA,WILEY,2021-01-19 +journal of international dispute settlement,2040-3593,2040-3585,journalofids,0,1,0,1,NA,Law,NA,OXFORD UNIV PRESS,2019-08-30 +journal of international economic law,1369-3034,1464-3758,jiel_oup,0,1,0,1,NA,Law,NA,OXFORD UNIV PRESS,2021-01-02 +journal of international economics,0022-1996,1873-0353,JIntlEcon,0,1,0,1,NA,Economics,NA,ELSEVIER,2019-09-22 +journal of international financial management & accounting,0954-1314,1467-646X,NA,0,1,0,0,NA,"Business, Finance",NA,WILEY,NA +journal of international financial markets institutions & money,1042-4431,1873-0612,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +journal of international management,1075-4253,1873-0620,JournalofIntMgt,0,1,0,1,NA,Management,NA,ELSEVIER,2020-02-02 +journal of international marketing,1069-031X,1547-7215,AMA_JIntlM,0,1,0,1,NA,Business,NA,SAGE PUBLICATIONS INC,NA +journal of international medical research,0300-0605,1473-2300,NA,0,0,1,0,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of international money and finance,0261-5606,1873-0639,NA,0,1,0,0,NA,"Business, Finance",NA,ELSEVIER SCI LTD,NA +journal of international relations and development,1408-6980,1581-1980,jird_jour,0,1,0,1,NA,International Relations | Political Science,NA,PALGRAVE MACMILLAN LTD,2021-01-19 +journal of international trade & economic development,0963-8199,1469-9559,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of internet technology,1607-9264,2079-4029,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,"LIBRARY & INFORMATION CENTER, NAT DONG HWA UNIV",NA +journal of interpersonal violence,0886-2605,1552-6518,NA,0,1,0,0,NA,"Criminology & Penology | Family Studies | Psychology, Applied",NA,SAGE PUBLICATIONS INC,NA +journal of interprofessional care,1356-1820,1469-9567,JICare,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,TAYLOR & FRANCIS INC,2009-09-06 +journal of interprofessional care,1356-1820,1469-9567,JICare,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,TAYLOR & FRANCIS INC,2009-09-06 +journal of intervention and statebuilding,1750-2977,1750-2985,jisbjournal,0,1,0,1,NA,International Relations,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-06-19 +journal of interventional cardiac electrophysiology,1383-875X,1572-8595,JICE_EP,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,SPRINGER,2014-07-03 +journal of interventional cardiology,0896-4327,1540-8183,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,WILEY-HINDAWI,NA +journal of invasive cardiology,1042-3931,1557-2501,InvasiveCardiol,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,H M P COMMUNICATIONS,2009-06-03 +journal of inverse and ill-posed problems,0928-0219,1569-3945,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WALTER DE GRUYTER GMBH,NA +journal of invertebrate pathology,0022-2011,1096-0805,JInvertPathol,0,0,1,1,Zoology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2021-07-08 +journal of investigational allergology and clinical immunology,1018-9068,1698-0808,NA,0,0,1,0,Allergy | Immunology,NA,NA,"ESMON PUBLICIDAD S A, DEPT ALLERGY & CLIN IMMUNOL, CLIN UNIV NAVARRA",NA +journal of investigative dermatology,0022-202X,1523-1747,NA,0,0,1,0,Dermatology,NA,NA,ELSEVIER SCIENCE INC,NA +journal of investigative medicine,1081-5589,1708-8267,NA,0,0,1,0,"Medicine, General & Internal | Medicine, Research & Experimental",NA,NA,BMJ PUBLISHING GROUP,NA +journal of investigative psychology and offender profiling,1544-4759,1544-4767,NA,0,1,0,0,NA,"Criminology & Penology | Psychology, Applied",NA,WILEY,NA +journal of investigative surgery,0894-1939,1521-0553,NA,0,0,1,0,Surgery,NA,NA,TAYLOR & FRANCIS INC,NA +journal of iron and steel research international,1006-706X,2210-3988,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER,NA +journal of irrigation and drainage engineering,0733-9437,1943-4774,NA,0,0,1,0,"Agricultural Engineering | Engineering, Civil | Water Resources",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of islamic studies,0955-2340,1471-6917,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",OXFORD UNIV PRESS,NA +journal of island & coastal archaeology,1556-4894,1556-1828,journal_island,1,0,0,1,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-06-25 +journal of israeli history,1353-1042,1744-0548,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of israeli history,1353-1042,1744-0548,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of japanese studies,0095-6848,1549-4721,jjs_jrnl,0,1,0,1,NA,Area Studies,NA,SOC JAPANESE STUD,2013-05-07 +journal of jewish studies,0022-2097,0022-2097,NA,1,0,0,0,NA,NA,Religion,OXFORD CENTRE HEBREW JEWISH STUDIES,NA +journal of jewish thought & philosophy,1053-699X,1477-285X,NA,1,0,0,0,NA,NA,Philosophy,BRILL,NA +journal of juristic papyrology,0075-4277,NA,NA,1,0,0,0,NA,NA,Archaeology,"WARSAW UNIV, INST ARCHAEOLOGY & PAPYROLOGY",NA +journal of king saud university-computer and information sciences,1319-1578,2213-1248,JKSUCI,0,0,1,1,"Computer Science, Information Systems",NA,NA,ELSEVIER,2019-02-06 +journal of king saud university science,1018-3647,2213-686X,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,ELSEVIER,NA +journal of knee surgery,1538-8506,1938-2480,NA,0,0,1,0,Orthopedics,NA,NA,GEORG THIEME VERLAG KG,NA +journal of knot theory and its ramifications,0218-2165,1793-6527,NA,0,0,1,0,Mathematics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of knowledge management,1367-3270,1758-7484,JournalEmerald,0,1,0,1,NA,Information Science & Library Science | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of korea trade,1229-828X,1229-828X,NA,0,1,0,0,NA,Economics,NA,KOREA TRADE RESEARCH ASSOC,NA +journal of korean academy of nursing,2005-3673,2093-758X,NA,0,1,1,0,Nursing,Nursing,NA,KOREAN SOC NURSING SCIENCE,NA +journal of korean academy of nursing,2005-3673,2093-758X,NA,0,1,1,0,Nursing,Nursing,NA,KOREAN SOC NURSING SCIENCE,NA +journal of korean medical science,1011-8934,1598-6357,JkmsOrg,0,0,1,1,"Medicine, General & Internal",NA,NA,KOREAN ACAD MEDICAL SCIENCES,2019-05-30 +journal of korean neurosurgical society,2005-3711,1598-7876,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,KOREAN NEUROSURGICAL SOC,NA +journal of korean religions,2093-7288,2167-2040,NA,1,0,0,0,NA,NA,Religion | Asian Studies,"INST STUDY RELIGION, SOGANG UNIV",NA +journal of korean studies,0731-1613,2158-1665,JournalKorea,1,0,0,1,NA,NA,History | Asian Studies,DUKE UNIV PRESS,2011-04-08 +journal of labelled compounds & radiopharmaceuticals,0362-4803,1099-1344,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Medicinal | Chemistry, Analytical",NA,NA,WILEY,NA +journal of labor economics,0734-306X,1537-5307,NA,0,1,0,0,NA,Economics | Industrial Relations & Labor,NA,UNIV CHICAGO PRESS,NA +journal of labor research,0195-3613,1936-4768,NA,0,1,0,0,NA,Industrial Relations & Labor,NA,SPRINGER,NA +journal of laboratory medicine,2567-9430,2567-9449,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,WALTER DE GRUYTER GMBH,NA +journal of land use science,1747-423X,1747-4248,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of landscape architecture,1862-6033,2164-604X,NA,1,0,0,0,NA,NA,Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of language and politics,1569-2159,1569-9862,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +journal of language and politics,1569-2159,1569-9862,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +journal of language and social psychology,0261-927X,1552-6526,jlangsocpsych,0,1,0,1,NA,"Communication | Linguistics | Psychology, Social",NA,SAGE PUBLICATIONS INC,2021-01-15 +journal of language identity and education,1534-8458,1532-7701,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of language identity and education,1534-8458,1532-7701,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of language literature and culture,2051-2856,2051-2864,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of laparoendoscopic & advanced surgical techniques,1092-6429,1557-9034,NA,0,0,1,0,Surgery,NA,NA,"MARY ANN LIEBERT, INC",NA +journal of laryngology and otology,0022-2151,1748-5460,LaryngolAndOtol,0,0,1,1,Otorhinolaryngology,NA,NA,CAMBRIDGE UNIV PRESS,2015-10-08 +journal of laser applications,1042-346X,1938-1387,NA,0,0,1,0,"Materials Science, Multidisciplinary | Optics | Physics, Applied",NA,NA,AIP PUBLISHING,NA +journal of laser micro nanoengineering,1880-0688,1880-0688,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Optics | Physics, Applied",NA,NA,JAPAN LASER PROCESSING SOC,NA +journal of latin american and caribbean anthropology,1935-4932,1935-4940,NA,0,1,0,0,NA,Anthropology,NA,WILEY,NA +journal of latin american cultural studies,1356-9325,1469-9575,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of latin american cultural studies,1356-9325,1469-9575,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of latin american studies,0022-216X,1469-767X,jlascamb,1,1,0,1,NA,Area Studies,"Humanities, Multidisciplinary",CAMBRIDGE UNIV PRESS,2014-07-24 +journal of latin american studies,0022-216X,1469-767X,jlascamb,1,1,0,1,NA,Area Studies,"Humanities, Multidisciplinary",CAMBRIDGE UNIV PRESS,2014-07-24 +journal of latinx psychology,2578-8086,2578-8094,NA,0,1,0,0,NA,"Psychology, Clinical | Psychology, Development | Psychology, Multidisciplinary | Psychology, Social",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +journal of law & economics,0022-2186,1537-5285,NA,0,1,0,0,NA,Economics | Law,NA,UNIV CHICAGO PRESS,NA +journal of law and society,0263-323X,1467-6478,jlawandsociety,0,1,0,1,NA,Law | Sociology,NA,WILEY,NA +journal of law and the biosciences,2053-9711,2053-9711,J_Law_Biosci,0,1,1,1,"Medical Ethics | Medicine, Legal",Ethics | Law,NA,OXFORD UNIV PRESS,2014-12-15 +journal of law and the biosciences,2053-9711,2053-9711,J_Law_Biosci,0,1,1,1,"Medical Ethics | Medicine, Legal",Ethics | Law,NA,OXFORD UNIV PRESS,2014-12-15 +journal of law economics & organization,8756-6222,1465-7341,NA,0,1,0,0,NA,Economics | Law,NA,OXFORD UNIV PRESS INC,NA +journal of law medicine & ethics,1073-1105,1748-720X,JLME_ASLME,0,1,1,1,"Medical Ethics | Medicine, Legal",Ethics | Law,NA,CAMBRIDGE UNIV PRESS,2020-03-29 +journal of law medicine & ethics,1073-1105,1748-720X,JLME_ASLME,0,1,1,1,"Medical Ethics | Medicine, Legal",Ethics | Law,NA,CAMBRIDGE UNIV PRESS,2020-03-29 +journal of leadership & organizational studies,1548-0518,1939-7089,NA,0,1,0,0,NA,Management,NA,SAGE PUBLICATIONS INC,NA +journal of learning disabilities,0022-2194,1538-4780,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SAGE PUBLICATIONS INC,NA +journal of legal analysis,2161-7201,1946-5319,NA,0,1,0,0,NA,Law,NA,OXFORD UNIV PRESS,NA +journal of legal education,0022-2208,0022-2208,NA,0,1,0,0,NA,Education & Educational Research | Law,NA,SOUTHWESTERN LAW SCH,NA +journal of legal history,0144-0365,1744-0564,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of legal medicine,0194-7648,1521-057X,NA,0,1,0,0,NA,"Law | Social Sciences, Biomedical",NA,TAYLOR & FRANCIS INC,NA +journal of legal studies,0047-2530,1537-5366,NA,0,1,0,0,NA,Law,NA,UNIV CHICAGO PRESS,NA +journal of leisure research,0022-2216,2159-6417,jlr_official,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,TAYLOR & FRANCIS INC,2020-02-27 +journal of leukocyte biology,0741-5400,1938-3673,jlb_journal,0,0,1,1,Cell Biology | Hematology | Immunology,NA,NA,WILEY,2019-01-02 +journal of librarianship and information science,0961-0006,1741-6477,JOLIS45,0,1,0,1,NA,Information Science & Library Science,NA,SAGE PUBLICATIONS LTD,2013-07-30 +journal of lie theory,0949-5932,0949-5932,NA,0,0,1,0,Mathematics,NA,NA,HELDERMANN VERLAG,NA +journal of lightwave technology,0733-8724,1558-2213,JrnlLT,0,0,1,1,"Engineering, Electrical & Electronic | Optics | Telecommunications",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2019-02-22 +journal of limnology,1129-5767,1723-8633,j_limnology,0,0,1,1,Limnology,NA,NA,PAGEPRESS PUBL,2020-11-12 +journal of linguistic anthropology,1055-1360,1548-1395,JournalLingAnth,1,1,0,1,NA,Anthropology | Linguistics,Language & Linguistics,WILEY,2021-08-18 +journal of linguistic anthropology,1055-1360,1548-1395,JournalLingAnth,1,1,0,1,NA,Anthropology | Linguistics,Language & Linguistics,WILEY,2021-08-18 +journal of linguistics,0022-2267,1469-7742,JoLinguistics,1,1,0,1,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,2021-11-22 +journal of linguistics,0022-2267,1469-7742,JoLinguistics,1,1,0,1,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,2021-11-22 +journal of lipid research,0022-2275,1539-7262,jlipidres,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,ELSEVIER,2013-01-23 +journal of liposome research,0898-2104,1532-2394,NA,0,0,1,0,Biochemistry & Molecular Biology | Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of liquid chromatography & related technologies,1082-6076,1520-572X,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,TAYLOR & FRANCIS INC,NA +journal of literacy research,1086-296X,1554-8430,JLiteracyRes,0,1,0,1,NA,"Education & Educational Research | Psychology, Educational",NA,SAGE PUBLICATIONS INC,2014-03-06 +journal of literary semantics,0341-7638,1613-3838,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,DE GRUYTER MOUTON,NA +journal of literary studies,0256-4718,1753-5387,JLS_lasa,1,0,0,1,NA,NA,Literary Theory & Criticism | Literature,UNISA PRESS,2021-09-30 +journal of logic and computation,0955-792X,1465-363X,NA,0,0,1,0,"Computer Science, Theory & Methods | Logic",NA,NA,OXFORD UNIV PRESS,NA +journal of logic language and information,0925-8531,1572-9583,NA,1,0,1,0,"Computer Science, Artificial Intelligence | Logic",NA,Philosophy | Language & Linguistics,SPRINGER,NA +journal of logic language and information,0925-8531,1572-9583,NA,1,0,1,0,"Computer Science, Artificial Intelligence | Logic",NA,Philosophy | Language & Linguistics,SPRINGER,NA +journal of logical and algebraic methods in programming,2352-2208,2352-2216,NA,0,0,1,0,"Computer Science, Theory & Methods | Logic",NA,NA,ELSEVIER SCIENCE INC,NA +journal of loss & trauma,1532-5024,1532-5032,NA,0,1,0,0,NA,"Psychology, Social",NA,TAYLOR & FRANCIS INC,NA +journal of loss prevention in the process industries,0950-4230,1873-3352,NA,0,0,1,0,"Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +journal of low frequency noise vibration and active control,1461-3484,2048-4046,NA,0,0,1,0,Acoustics,NA,NA,SAGE PUBLICATIONS LTD,NA +journal of low temperature physics,0022-2291,1573-7357,NA,0,0,1,0,"Physics, Applied | Physics, Condensed Matter",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of lower genital tract disease,1089-2591,1526-0976,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of luminescence,0022-2313,1872-7883,NA,0,0,1,0,Optics,NA,NA,ELSEVIER,NA +journal of machine learning research,1532-4435,1533-7928,JmlrOrg,0,0,1,1,"Automation & Control Systems | Computer Science, Artificial Intelligence",NA,NA,MICROTOME PUBL,2018-05-04 +journal of macroeconomics,0164-0704,1873-152X,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +journal of macromarketing,0276-1467,1552-6534,JMacromarketing,0,1,0,1,NA,Business,NA,SAGE PUBLICATIONS INC,2013-06-09 +journal of macromolecular science part a-pure and applied chemistry,1060-1325,1520-5738,NA,0,0,1,0,Polymer Science,NA,NA,TAYLOR & FRANCIS INC,NA +journal of macromolecular science part b-physics,0022-2348,1525-609X,NA,0,0,1,0,Polymer Science,NA,NA,TAYLOR & FRANCIS INC,NA +journal of magnesium and alloys,2213-9567,2213-9567,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,KEAI PUBLISHING LTD,NA +journal of magnetic resonance,1090-7807,1096-0856,NA,0,0,1,0,"Biochemical Research Methods | Physics, Atomic, Molecular & Chemical | Spectroscopy",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of magnetic resonance imaging,1053-1807,1522-2586,jmri_ismrm,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,2016-03-01 +journal of magnetics,1226-1750,2233-6656,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,KOREAN MAGNETICS SOC,NA +journal of magnetism and magnetic materials,0304-8853,1873-4766,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +journal of mammalian evolution,1064-7554,1573-7055,NA,0,0,1,0,Zoology,NA,NA,SPRINGER,NA +journal of mammalogy,0022-2372,1545-1542,NA,0,0,1,0,Zoology,NA,NA,OXFORD UNIV PRESS INC,NA +journal of mammary gland biology and neoplasia,1083-3021,1573-7039,Mammary_journal,0,0,1,1,Oncology | Endocrinology & Metabolism | Physiology,NA,NA,SPRINGER/PLENUM PUBLISHERS,2020-04-08 +journal of managed care & specialty pharmacy,2376-0540,2376-1032,NA,0,0,1,0,Health Care Sciences & Services | Pharmacology & Pharmacy,NA,NA,ACAD MANAGED CARE PHARMACY,NA +journal of management,0149-2063,1557-1211,Journal_of_Mgmt,0,1,0,1,NA,"Business | Psychology, Applied | Management",NA,SAGE PUBLICATIONS INC,2012-01-11 +journal of management & organization,1833-3672,1839-3527,JMO_news,0,1,0,1,NA,Management,NA,CAMBRIDGE UNIV PRESS,2020-05-27 +journal of management in engineering,0742-597X,1943-5479,JMEASCE,0,0,1,1,"Engineering, Industrial | Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,2017-11-28 +journal of management information systems,0742-1222,1557-928X,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of management information systems,0742-1222,1557-928X,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of management inquiry,1056-4926,1552-6542,NA,0,1,0,0,NA,Management,NA,SAGE PUBLICATIONS INC,NA +journal of management studies,0022-2380,1467-6486,JMS_Journal,0,1,0,1,NA,Business | Management,NA,WILEY,2015-06-01 +journal of managerial psychology,0268-3946,1758-7778,JnlManPsych,0,1,0,1,NA,"Psychology, Applied | Management",NA,EMERALD GROUP PUBLISHING LTD,2018-03-16 +journal of manipulative and physiological therapeutics,0161-4754,1532-6586,NA,0,0,1,0,Health Care Sciences & Services | Integrative & Complementary Medicine | Rehabilitation,NA,NA,MOSBY-ELSEVIER,NA +journal of manufacturing processes,1526-6125,2212-4616,NA,0,0,1,0,"Engineering, Manufacturing",NA,NA,ELSEVIER SCI LTD,NA +journal of manufacturing science and engineering-transactions of the asme,1087-1357,1528-8935,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Mechanical",NA,NA,ASME,NA +journal of manufacturing systems,0278-6125,1878-6642,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing | Operations Research & Management Science",NA,NA,ELSEVIER SCI LTD,NA +journal of manufacturing technology management,1741-038X,1758-7786,NA,0,1,1,0,"Engineering, Industrial | Engineering, Manufacturing",Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of manufacturing technology management,1741-038X,1758-7786,NA,0,1,1,0,"Engineering, Industrial | Engineering, Manufacturing",Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of maps,1744-5647,1744-5647,journalofmaps,0,1,1,1,"Geography, Physical",Geography,NA,TAYLOR & FRANCIS LTD,2020-11-14 +journal of maps,1744-5647,1744-5647,journalofmaps,0,1,1,1,"Geography, Physical",Geography,NA,TAYLOR & FRANCIS LTD,2020-11-14 +journal of marine engineering and technology,2046-4177,2056-8487,NA,0,0,1,0,"Engineering, Marine",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of marine research,0022-2402,1543-9542,NA,0,0,1,0,Oceanography,NA,NA,SEARS FOUNDATION MARINE RESEARCH,NA +journal of marine science and engineering,2077-1312,2077-1312,JMSE_MDPI,0,0,1,1,"Engineering, Marine | Oceanography | Engineering, Ocean",NA,NA,MDPI,2017-10-25 +journal of marine science and technology,0948-4280,1437-8213,NA,0,0,1,0,"Engineering, Marine | Engineering, Civil",NA,NA,SPRINGER JAPAN KK,NA +journal of marine science and technology-taiwan,1023-2796,2709-6998,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,"NATL TAIWAN OCEAN UNIV",NA +journal of marine systems,0924-7963,1879-1573,NA,0,0,1,0,"Geosciences, Multidisciplinary | Marine & Freshwater Biology | Oceanography",NA,NA,ELSEVIER,NA +journal of marital and family therapy,0194-472X,1752-0606,NA,0,1,0,0,NA,"Psychology, Clinical | Family Studies",NA,WILEY,NA +journal of maritime archaeology,1557-2285,1557-2293,JMaritimeArch,1,0,0,1,NA,NA,Archaeology,SPRINGER,2019-10-31 +journal of marketing,0022-2429,1547-7185,JofMarketing,0,1,0,1,NA,Business,NA,SAGE PUBLICATIONS INC,2018-01-26 +journal of marketing for higher education,0884-1241,1540-7144,NA,0,1,0,0,NA,Business | Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of marketing management,0267-257X,1472-1376,JMM_news,0,1,0,1,NA,Business | Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-11-14 +journal of marketing research,0022-2437,1547-7193,AMA_JMR,0,1,0,1,NA,Business,NA,SAGE PUBLICATIONS INC,NA +journal of marriage and family,0022-2445,1741-3737,jmf_ncfr,0,1,0,1,NA,Family Studies | Sociology,NA,WILEY,2017-01-11 +journal of mass spectrometry,1076-5174,1096-9888,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical | Spectroscopy",NA,NA,WILEY,NA +journal of mass spectrometry and advances in the clinical lab,2667-145X,2667-145X,NA,0,0,1,0,Medical Laboratory Technology,NA,NA,ELSEVIER,NA +journal of material culture,1359-1835,1460-3586,NA,1,1,0,0,NA,Cultural Studies | Anthropology,Cultural Studies | Archaeology,SAGE PUBLICATIONS LTD,NA +journal of material culture,1359-1835,1460-3586,NA,1,1,0,0,NA,Cultural Studies | Anthropology,Cultural Studies | Archaeology,SAGE PUBLICATIONS LTD,NA +journal of material cycles and waste management,1438-4957,1611-8227,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +journal of materials chemistry a,2050-7488,2050-7496,NA,0,0,1,0,"Chemistry, Physical | Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,NA +journal of materials chemistry b,2050-750X,2050-7518,NA,0,0,1,0,"Materials Science, Biomaterials",NA,NA,ROYAL SOC CHEMISTRY,NA +journal of materials chemistry c,2050-7526,2050-7534,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ROYAL SOC CHEMISTRY,NA +journal of materials education,0738-7989,NA,NA,0,0,1,0,"Education, Scientific Disciplines | Materials Science, Multidisciplinary",NA,NA,INT COUNCIL MATERIALS EDUCATION,NA +journal of materials engineering and performance,1059-9495,1544-1024,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +journal of materials in civil engineering,0899-1561,1943-5533,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of materials processing technology,0924-0136,1873-4774,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCIENCE SA,NA +journal of materials research,0884-2914,2044-5326,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +journal of materials research and technology-jmr&t,2238-7854,2214-0697,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,ELSEVIER,NA +journal of materials science,0022-2461,1573-4803,JMaterSci,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,SPRINGER,2016-12-02 +journal of materials science-materials in electronics,0957-4522,1573-482X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,SPRINGER,NA +journal of materials science-materials in medicine,0957-4530,1573-4838,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,SPRINGER,NA +journal of materials science & technology,1005-0302,1941-1162,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,JOURNAL MATER SCI TECHNOL,NA +journal of materiomics,2352-8478,2352-8478,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER,NA +journal of maternal-fetal & neonatal medicine,1476-7058,1476-4954,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of mathematical analysis and applications,0022-247X,1096-0813,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of mathematical biology,0303-6812,1432-1416,JournalMathBio,0,0,1,1,Biology | Mathematical & Computational Biology,NA,NA,SPRINGER HEIDELBERG,2021-12-26 +journal of mathematical chemistry,0259-9791,1572-8897,NA,0,0,1,0,"Chemistry, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER,NA +journal of mathematical economics,0304-4068,1873-1538,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Economics | Social Sciences, Mathematical Methods",NA,ELSEVIER SCIENCE SA,NA +journal of mathematical economics,0304-4068,1873-1538,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Economics | Social Sciences, Mathematical Methods",NA,ELSEVIER SCIENCE SA,NA +journal of mathematical fluid mechanics,1422-6928,1422-6952,NA,0,0,1,0,"Mathematics, Applied | Mechanics | Physics, Fluids & Plasmas",NA,NA,SPRINGER BASEL AG,NA +journal of mathematical imaging and vision,0924-9907,1573-7683,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Software Engineering | Mathematics, Applied",NA,NA,SPRINGER,NA +journal of mathematical inequalities,1846-579X,1846-579X,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ELEMENT,NA +journal of mathematical logic,0219-0613,1793-6691,NA,0,0,1,0,Mathematics | Logic,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of mathematical neuroscience,2190-8567,2190-8567,NA,0,0,1,0,"Mathematical & Computational Biology | Mathematics, Interdisciplinary Applications | Neurosciences",NA,NA,SPRINGER,NA +journal of mathematical physics,0022-2488,1089-7658,NA,0,0,1,0,"Physics, Mathematical",NA,NA,AIP PUBLISHING,NA +journal of mathematical physics analysis geometry,1812-9471,1817-5805,NA,0,0,1,0,"Mathematics, Applied | Mathematics | Physics, Mathematical",NA,NA,B. VERKIN INST LOW TEMPERATURE PHYSICS AND ENGINEERING NATL ACAD SCIENCES UKRAINE,NA +journal of mathematical psychology,0022-2496,1096-0880,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods | Psychology, Mathematical",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of mathematical psychology,0022-2496,1096-0880,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods | Psychology, Mathematical",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of mathematical sociology,0022-250X,1545-5874,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods | Sociology",NA,TAYLOR & FRANCIS INC,NA +journal of mathematical sociology,0022-250X,1545-5874,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods | Sociology",NA,TAYLOR & FRANCIS INC,NA +journal of mathematics,2314-4629,2314-4785,NA,0,0,1,0,Mathematics,NA,NA,HINDAWI LTD,NA +journal of mathematics and music,1745-9737,1745-9745,NA,1,0,1,0,"Mathematics, Interdisciplinary Applications",NA,Music,TAYLOR & FRANCIS LTD,NA +journal of mathematics and music,1745-9737,1745-9745,NA,1,0,1,0,"Mathematics, Interdisciplinary Applications",NA,Music,TAYLOR & FRANCIS LTD,NA +journal of mathematics teacher education,1386-4416,1573-1820,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +journal of mechanical design,1050-0472,1528-9001,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASME,NA +journal of mechanical science and technology,1738-494X,1976-3824,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,KOREAN SOC MECHANICAL ENGINEERS,NA +journal of mechanics,1727-7191,1811-8216,NA,0,0,1,0,Mechanics,NA,NA,OXFORD UNIV PRESS,NA +journal of mechanics in medicine and biology,0219-5194,1793-6810,NA,0,0,1,0,"Biophysics | Engineering, Biomedical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of mechanics of materials and structures,1559-3959,1559-3959,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics",NA,NA,MATHEMATICAL SCIENCE PUBL,NA +journal of mechanisms and robotics-transactions of the asme,1942-4302,1942-4310,ASME_JMR,0,0,1,1,"Engineering, Mechanical | Robotics",NA,NA,ASME,NA +journal of media economics,0899-7764,1532-7736,NA,0,1,0,0,NA,Communication | Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of media ethics,2373-6992,2373-700X,NA,0,1,0,0,NA,Communication | Ethics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of media psychology-theories methods and applications,1864-1105,2151-2388,JMP_Hogrefe,0,1,0,1,NA,"Communication | Psychology, Multidisciplinary",NA,HOGREFE PUBLISHING CORP,2020-08-26 +journal of medical and biological engineering,1609-0985,2199-4757,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,SPRINGER HEIDELBERG,NA +journal of medical biochemistry,1452-8258,1452-8266,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,SOC MEDICAL BIOCHEMISTS SERBIA,NA +journal of medical biography,0967-7720,1758-1087,NA,1,0,0,0,NA,NA,History & Philosophy Of Science,SAGE PUBLICATIONS INC,NA +journal of medical devices-transactions of the asme,1932-6181,1932-619X,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,ASME,NA +journal of medical economics,1369-6998,1941-837X,JME_Journal,0,0,1,1,"Health Care Sciences & Services | Medicine, General & Internal",NA,NA,TAYLOR & FRANCIS LTD,2009-04-15 +journal of medical entomology,0022-2585,1938-2928,NA,0,0,1,0,Entomology | Veterinary Sciences,NA,NA,OXFORD UNIV PRESS INC,NA +journal of medical ethics,0306-6800,1473-4257,JME_BMJ,0,1,1,1,Medical Ethics,"Ethics | Social Issues | Social Sciences, Biomedical",NA,BMJ PUBLISHING GROUP,2010-05-07 +journal of medical ethics,0306-6800,1473-4257,JME_BMJ,0,1,1,1,Medical Ethics,"Ethics | Social Issues | Social Sciences, Biomedical",NA,BMJ PUBLISHING GROUP,2010-05-07 +journal of medical genetics,0022-2593,1468-6244,JMG_BMJ,0,0,1,1,Genetics & Heredity,NA,NA,BMJ PUBLISHING GROUP,2010-04-16 +journal of medical imaging and radiation oncology,1754-9477,1754-9485,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,NA +journal of medical internet research,1438-8871,1438-8871,JMIR_,0,0,1,1,Health Care Sciences & Services | Medical Informatics,NA,NA,"JMIR PUBLICATIONS, INC",2021-06-02 +journal of medical microbiology,0022-2615,1473-5644,NA,0,0,1,0,Microbiology,NA,NA,MICROBIOLOGY SOC,NA +journal of medical primatology,0047-2565,1600-0684,NA,0,0,1,0,Veterinary Sciences | Zoology,NA,NA,WILEY,NA +journal of medical screening,0969-1413,1475-5793,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of medical systems,0148-5598,1573-689X,NA,0,0,1,0,Health Care Sciences & Services | Medical Informatics,NA,NA,SPRINGER,NA +journal of medical toxicology,1556-9039,1937-6995,JMT_tweets,0,0,1,1,Toxicology,NA,NA,SPRINGER,2014-03-25 +journal of medical ultrasonics,1346-4523,1613-2254,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER JAPAN KK,NA +journal of medical virology,0146-6615,1096-9071,NA,0,0,1,0,Virology,NA,NA,WILEY,NA +journal of medicinal chemistry,0022-2623,1520-4804,NA,0,0,1,0,"Chemistry, Medicinal",NA,NA,AMER CHEMICAL SOC,NA +journal of medicinal food,1096-620X,1557-7600,NA,0,0,1,0,"Chemistry, Medicinal | Food Science & Technology | Nutrition & Dietetics",NA,NA,"MARY ANN LIEBERT, INC",NA +journal of medicine and philosophy,0360-5310,1744-5019,NA,0,1,0,0,NA,"Ethics | Social Sciences, Biomedical",NA,OXFORD UNIV PRESS INC,NA +journal of medieval and early modern studies,1082-9636,1082-9636,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,DUKE UNIV PRESS,NA +journal of medieval history,0304-4181,1873-1279,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of medieval iberian studies,1754-6559,1754-6567,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of mediterranean archaeology,0952-7648,1743-1700,NA,1,0,0,0,NA,NA,Archaeology,EQUINOX PUBLISHING LTD,NA +journal of mediterranean studies,1016-3476,2523-9465,NA,1,0,0,0,NA,NA,History,MEDITERRANEAN INST UNIV MALTA,NA +journal of membrane biology,0022-2631,1432-1424,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology | Physiology,NA,NA,SPRINGER,NA +journal of membrane science,0376-7388,1873-3123,J_Membrane_Sci,0,0,1,1,"Engineering, Chemical | Polymer Science",NA,NA,ELSEVIER,2021-08-04 +journal of memory and language,0749-596X,1096-0821,NA,0,1,1,0,Psychology,"Linguistics | Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of memory and language,0749-596X,1096-0821,NA,0,1,1,0,Psychology,"Linguistics | Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of mens health,1875-6867,1875-6859,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,IMR PRESS,NA +journal of mens health,1875-6867,1875-6859,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,IMR PRESS,NA +journal of mental health,0963-8237,1360-0567,jofmentalhealth,0,1,0,1,NA,"Psychology, Clinical",NA,TAYLOR & FRANCIS INC,2020-07-31 +journal of mental health policy and economics,1091-4358,1099-176X,NA,0,1,0,0,NA,Health Policy & Services | Psychiatry,NA,INT CTR MENTAL HEALTH POLICY & ECONOMICS-ICMPE,NA +journal of mental health research in intellectual disabilities,1931-5864,1931-5872,NA,0,1,0,0,NA,"Education, Special | Psychiatry | Rehabilitation",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of metamorphic geology,0263-4929,1525-1314,NA,0,0,1,0,Geology,NA,NA,WILEY,NA +journal of meteorological research,2095-6037,2198-0934,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,SPRINGER HEIDELBERG,NA +journal of micro-nanopatterning materials and metrology-jm3,1932-5150,1932-5134,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Optics",NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +journal of microbiological methods,0167-7012,1872-8359,NA,0,0,1,0,Biochemical Research Methods | Microbiology,NA,NA,ELSEVIER,NA +journal of microbiology,1225-8873,1976-3794,NA,0,0,1,0,Microbiology,NA,NA,MICROBIOLOGICAL SOCIETY KOREA,NA +journal of microbiology and biotechnology,1017-7825,1738-8872,KMBJMB,0,0,1,1,Biotechnology & Applied Microbiology | Microbiology,NA,NA,KOREAN SOC MICROBIOLOGY & BIOTECHNOLOGY,NA +journal of microbiology immunology and infection,1684-1182,1995-9133,NA,0,0,1,0,Immunology | Infectious Diseases | Microbiology,NA,NA,ELSEVIER TAIWAN,NA +journal of microelectromechanical systems,1057-7157,1941-0158,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Instruments & Instrumentation | Physics, Applied",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +journal of microencapsulation,0265-2048,1464-5246,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical | Pharmacology & Pharmacy",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of micromechanics and microengineering,0960-1317,1361-6439,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Instruments & Instrumentation | Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +journal of micropalaeontology,0262-821X,2041-4978,TMS_JM,0,0,1,1,Paleontology,NA,NA,COPERNICUS GESELLSCHAFT MBH,2017-12-20 +journal of microscopy,0022-2720,1365-2818,JofMicroscopy,0,0,1,1,Microscopy,NA,NA,WILEY,2009-09-16 +journal of microwave power and electromagnetic energy,0832-7823,0832-7823,NA,0,0,1,0,"Engineering, Chemical | Engineering, Electrical & Electronic | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS INC,NA +journal of middle east womens studies,1552-5864,1558-9579,jmews,0,1,0,1,NA,Women'S Studies,NA,DUKE UNIV PRESS,2011-04-23 +journal of midwifery & womens health,1526-9523,1542-2011,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +journal of midwifery & womens health,1526-9523,1542-2011,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +journal of military history,0899-3718,1543-7795,NA,1,0,0,0,NA,NA,History,SOC MILITARY HISTORY,NA +journal of mineralogical and petrological sciences,1345-6296,1349-3825,NA,0,0,1,0,Mineralogy,NA,NA,JAPAN ASSOC MINERALOGICAL SCIENCES,NA +journal of minimal access surgery,0972-9941,1998-3921,NA,0,0,1,0,Surgery,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +journal of minimally invasive gynecology,1553-4650,1553-4669,AAGLJMIG,0,0,1,1,Obstetrics & Gynecology,NA,NA,ELSEVIER SCIENCE INC,2016-03-23 +journal of mining and metallurgy section b-metallurgy,1450-5339,2217-7175,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,"TECHNICAL FACULTY, BOR-SERBIA",NA +journal of mining science,1062-7391,1573-8736,NA,0,0,1,0,Mining & Mineral Processing,NA,NA,PLEIADES PUBLISHING INC,NA +journal of mixed methods research,1558-6898,1558-6901,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +journal of modern african studies,0022-278X,1469-7777,jmodafstudies,0,1,0,1,NA,Area Studies,NA,CAMBRIDGE UNIV PRESS,2017-11-21 +journal of modern craft,1749-6772,1749-6780,NA,1,0,0,0,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of modern dynamics,1930-5311,1930-532X,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +journal of modern european history,1611-8944,2631-9764,NA,1,1,0,0,NA,History,History,SAGE PUBLICATIONS LTD,NA +journal of modern european history,1611-8944,2631-9764,NA,1,1,0,0,NA,History,History,SAGE PUBLICATIONS LTD,NA +journal of modern greek studies,0738-1727,1086-3265,JournalGreek,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,2019-01-24 +journal of modern history,0022-2801,1537-5358,NA,1,1,0,0,NA,History,History,UNIV CHICAGO PRESS,NA +journal of modern history,0022-2801,1537-5358,NA,1,1,0,0,NA,History,History,UNIV CHICAGO PRESS,NA +journal of modern italian studies,1354-571X,1469-9583,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of modern italian studies,1354-571X,1469-9583,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of modern literature,0022-281X,1529-1464,NA,1,0,0,0,NA,NA,Literature,INDIANA UNIV PRESS,NA +journal of modern optics,0950-0340,1362-3044,NA,0,0,1,0,Optics,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of modern power systems and clean energy,2196-5625,2196-5420,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,NA +journal of molecular and cellular cardiology,0022-2828,1095-8584,JMCCardiology,0,0,1,1,Cardiac & Cardiovascular System | Cell Biology,NA,NA,ELSEVIER SCI LTD,2019-12-04 +journal of molecular biology,0022-2836,1089-8638,JMolBiol,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,2012-10-30 +journal of molecular cell biology,1674-2788,1759-4685,OUP_JMCB,0,0,1,1,Cell Biology,NA,NA,OXFORD UNIV PRESS,2019-08-10 +journal of molecular diagnostics,1525-1578,1943-7811,JMDiagn,0,0,1,1,Pathology,NA,NA,ELSEVIER SCIENCE INC,2013-05-15 +journal of molecular endocrinology,0952-5041,1479-6813,JMolEndo,0,0,1,1,Endocrinology & Metabolism,NA,NA,BIOSCIENTIFICA LTD,2015-12-15 +journal of molecular evolution,0022-2844,1432-1432,JMolEvo,0,0,1,1,Biochemistry & Molecular Biology | Evolutionary Biology | Genetics & Heredity,NA,NA,SPRINGER,2017-09-11 +journal of molecular graphics & modelling,1093-3263,1873-4243,NA,0,0,1,0,"Biochemical Research Methods | Biochemistry & Molecular Biology | Computer Science, Interdisciplinary Applications | Crystallography | Mathematical & Computational Biology",NA,NA,ELSEVIER SCIENCE INC,NA +journal of molecular histology,1567-2379,1567-2387,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGER,NA +journal of molecular liquids,0167-7322,1873-3166,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,ELSEVIER,NA +journal of molecular medicine-jmm,0946-2716,1432-1440,NA,0,0,1,0,"Genetics & Heredity | Medicine, Research & Experimental",NA,NA,SPRINGER HEIDELBERG,NA +journal of molecular modeling,1610-2940,0948-5023,NA,0,0,1,0,"Biochemistry & Molecular Biology | Biophysics | Chemistry, Multidisciplinary | Computer Science, Interdisciplinary Applications",NA,NA,SPRINGER,NA +journal of molecular neuroscience,0895-8696,1559-1166,NA,0,0,1,0,Biochemistry & Molecular Biology | Neurosciences,NA,NA,SPRINGERNATURE,NA +journal of molecular recognition,0952-3499,1099-1352,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,WILEY,NA +journal of molecular spectroscopy,0022-2852,1096-083X,NA,0,0,1,0,"Physics, Atomic, Molecular & Chemical | Spectroscopy",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of molecular structure,0022-2860,1872-8014,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER,NA +journal of molluscan studies,0260-1230,1464-3766,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,OXFORD UNIV PRESS,NA +journal of monetary economics,0304-3932,1873-1295,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER,NA +journal of money credit and banking,0022-2879,1538-4616,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,WILEY,NA +journal of moral education,0305-7240,1465-3877,JournalMoralEd,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-07-03 +journal of moral philosophy,1740-4681,1745-5243,NA,1,1,0,0,NA,Ethics,Philosophy,BRILL,NA +journal of moral philosophy,1740-4681,1745-5243,NA,1,1,0,0,NA,Ethics,Philosophy,BRILL,NA +journal of morphology,0362-2525,1097-4687,NA,0,0,1,0,Anatomy & Morphology,NA,NA,WILEY,NA +journal of motor behavior,0022-2895,1940-1027,NA,0,1,1,0,Neurosciences | Psychology | Sport Sciences,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of motor behavior,0022-2895,1940-1027,NA,0,1,1,0,Neurosciences | Psychology | Sport Sciences,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of mountain science,1672-6316,1993-0321,NA,0,0,1,0,Environmental Sciences,NA,NA,SCIENCE PRESS,NA +journal of movement disorders,2005-940X,2093-4939,NA,0,0,1,0,Clinical Neurology,NA,NA,KOREAN MOVEMENT DISORDERS SOC,NA +journal of multicultural counseling and development,0883-8534,2161-1912,NA,0,1,0,0,NA,"Psychology, Applied",NA,WILEY,NA +journal of multidisciplinary healthcare,1178-2390,1178-2390,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,DOVE MEDICAL PRESS LTD,NA +journal of multilingual and multicultural development,0143-4632,1747-7557,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of multilingual and multicultural development,0143-4632,1747-7557,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of multinational financial management,1042-444X,1873-1309,NA,0,1,0,0,NA,"Business, Finance",NA,ELSEVIER,NA +journal of multiple-valued logic and soft computing,1542-3980,1542-3999,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods | Logic",NA,NA,OLD CITY PUBLISHING INC,NA +journal of multivariate analysis,0047-259X,1095-7243,NA,0,0,1,0,Statistics & Probability,NA,NA,ELSEVIER INC,NA +journal of muscle research and cell motility,0142-4319,1573-2657,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGER,NA +journal of musculoskeletal & neuronal interactions,1108-7161,NA,TheJMNI,0,0,1,1,Neurosciences | Physiology,NA,NA,JMNI,2016-02-13 +journal of music theory,0022-2909,1941-7497,NA,1,0,0,0,NA,NA,Music,DUKE UNIV PRESS,NA +journal of music therapy,0022-2917,2053-7395,NA,0,1,0,0,NA,Rehabilitation,NA,OXFORD UNIV PRESS INC,NA +journal of musicological research,0141-1896,1547-7304,NA,1,0,0,0,NA,NA,Music,TAYLOR & FRANCIS LTD,NA +journal of musicology,0277-9269,1533-8347,NA,1,0,0,0,NA,NA,Music,UNIV CALIFORNIA PRESS,NA +journal of nano research,1662-5250,1661-9897,JNanoR,0,0,1,1,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,TRANS TECH PUBLICATIONS LTD,2009-09-01 +journal of nanobiotechnology,1477-3155,1477-3155,JNanobiotech,0,0,1,1,Biotechnology & Applied Microbiology | Nanoscience & Nanotechnology,NA,NA,BMC,2021-09-01 +journal of nanoelectronics and optoelectronics,1555-130X,1555-1318,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Physics, Applied",NA,NA,AMER SCIENTIFIC PUBLISHERS,NA +journal of nanomaterials,1687-4110,1687-4129,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,HINDAWI LTD,NA +journal of nanoparticle research,1388-0764,1572-896X,NA,0,0,1,0,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +journal of nanophotonics,1934-2608,NA,NA,0,0,1,0,Nanoscience & Nanotechnology | Optics,NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +journal of nanostructure in chemistry,2008-9244,2193-8865,JNCSpringer,0,0,1,1,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,2021-12-10 +journal of natural fibers,1544-0478,1544-046X,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,TAYLOR & FRANCIS INC,NA +journal of natural gas science and engineering,1875-5100,2212-3865,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +journal of natural history,0022-2933,1464-5262,NA,0,0,1,0,Biodiversity Conservation | Ecology | Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of natural medicines,1340-3443,1861-0293,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,SPRINGER JAPAN KK,NA +journal of natural products,0163-3864,1520-6025,NA,0,0,1,0,"Plant Sciences | Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,AMER CHEMICAL SOC,NA +journal of navigation,0373-4633,1469-7785,JoN_RIN_,0,0,1,1,"Engineering, Marine | Oceanography",NA,NA,CAMBRIDGE UNIV PRESS,2020-05-18 +journal of near eastern studies,0022-2968,1545-6978,NA,1,0,0,0,NA,NA,Archaeology | Asian Studies,UNIV CHICAGO PRESS,NA +journal of near infrared spectroscopy,0967-0335,1751-6552,NA,0,0,1,0,"Chemistry, Applied | Spectroscopy",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of nematology,0022-300X,2640-396X,NA,0,0,1,0,Zoology,NA,NA,SOC NEMATOLOGISTS,NA +journal of nepal medical association,0028-2715,1815-672X,NA,0,0,1,0,"Public, Environmental & Occupational Health | Medicine, General & Internal",NA,NA,NEPAL MEDICAL ASSOC,NA +journal of nephrology,1121-8428,1724-6059,JournalofNeph,0,0,1,1,Urology & Nephrology,NA,NA,SPRINGER HEIDELBERG,2020-05-11 +journal of nervous and mental disease,0022-3018,1539-736X,NA,0,1,1,0,Clinical Neurology | Psychiatry,Psychiatry,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of nervous and mental disease,0022-3018,1539-736X,NA,0,1,1,0,Clinical Neurology | Psychiatry,Psychiatry,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of network and computer applications,1084-8045,1095-8592,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Interdisciplinary Applications | Computer Science, Software Engineering",NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of network and systems management,1064-7570,1573-7705,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,SPRINGER,NA +journal of neural engineering,1741-2560,1741-2552,NA,0,0,1,0,"Engineering, Biomedical | Neurosciences",NA,NA,IOP PUBLISHING LTD,NA +journal of neural transmission,0300-9564,1435-1463,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,SPRINGER WIEN,NA +journal of neuro-oncology,0167-594X,1573-7373,JNeurooncol,0,0,1,1,Oncology | Clinical Neurology,NA,NA,SPRINGER,2018-01-08 +journal of neuro-ophthalmology,1070-8022,1536-5166,NA,0,0,1,0,Clinical Neurology | Ophthalmology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of neurochemistry,0022-3042,1471-4159,JNeurochem,0,0,1,1,Biochemistry & Molecular Biology | Neurosciences,NA,NA,WILEY,2017-12-04 +journal of neurodevelopmental disorders,1866-1947,1866-1955,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,BMC,NA +journal of neuroendocrinology,0953-8194,1365-2826,JNE_Editor,0,0,1,1,Endocrinology & Metabolism | Neurosciences,NA,NA,WILEY,2014-10-06 +journal of neuroengineering and rehabilitation,1743-0003,1743-0003,NA,0,0,1,0,"Engineering, Biomedical | Neurosciences | Rehabilitation",NA,NA,BMC,NA +journal of neurogastroenterology and motility,2093-0879,2093-0887,NA,0,0,1,0,Gastroenterology & Hepatology | Clinical Neurology,NA,NA,KOREAN SOC NEUROGASTROENTEROLOGY & MOTILITY,NA +journal of neurogenetics,0167-7063,1563-5260,NA,0,0,1,0,Genetics & Heredity | Neurosciences,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of neuroimaging,1051-2284,1552-6569,JNeuroimaging,0,0,1,1,"Clinical Neurology | Neuroimaging | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,2019-12-17 +journal of neuroimmune pharmacology,1557-1890,1557-1904,NA,0,0,1,0,Neurosciences | Pharmacology & Pharmacy,NA,NA,SPRINGER,NA +journal of neuroimmunology,0165-5728,1872-8421,JournalofNeuro1,0,0,1,1,Immunology | Neurosciences,NA,NA,ELSEVIER,2020-11-04 +journal of neuroinflammation,1742-2094,1742-2094,NA,0,0,1,0,Immunology | Neurosciences,NA,NA,BMC,NA +journal of neurointerventional surgery,1759-8478,1759-8486,JNIS_BMJ,0,0,1,1,Neuroimaging | Surgery,NA,NA,BMJ PUBLISHING GROUP,2010-05-12 +journal of neurolinguistics,0911-6044,1873-8052,NA,0,1,1,0,Neurosciences,"Linguistics | Psychology, Experimental",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of neurolinguistics,0911-6044,1873-8052,NA,0,1,1,0,Neurosciences,"Linguistics | Psychology, Experimental",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of neurologic physical therapy,1557-0576,1557-0584,JNPT,0,0,1,1,Clinical Neurology | Rehabilitation,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-04-30 +journal of neurological surgery part a-central european neurosurgery,2193-6315,2193-6323,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,THIEME MEDICAL PUBL INC,NA +journal of neurological surgery part b-skull base,2193-6331,2193-634X,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,THIEME MEDICAL PUBL INC,NA +journal of neurology,0340-5354,1432-1459,NA,0,0,1,0,Clinical Neurology,NA,NA,SPRINGER HEIDELBERG,NA +journal of neurology neurosurgery and psychiatry,0022-3050,1468-330X,NA,0,0,1,0,Clinical Neurology | Psychiatry | Surgery,NA,NA,BMJ PUBLISHING GROUP,NA +journal of neuromuscular diseases,2214-3599,2214-3602,journal_nd,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,IOS PRESS,2018-07-03 +journal of neuropathology and experimental neurology,0022-3069,1554-6578,NA,0,0,1,0,Clinical Neurology | Neurosciences | Pathology,NA,NA,OXFORD UNIV PRESS INC,NA +journal of neurophysiology,0022-3077,1522-1598,JNeurophysiol,0,0,1,1,Neurosciences | Physiology,NA,NA,AMER PHYSIOLOGICAL SOC,2014-05-23 +journal of neuropsychiatry and clinical neurosciences,0895-0172,1545-7222,NA,0,0,1,0,Clinical Neurology | Neurosciences | Psychiatry,NA,NA,"AMER PSYCHIATRIC PUBLISHING, INC",NA +journal of neuropsychology,1748-6645,1748-6653,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,WILEY,NA +journal of neuropsychology,1748-6645,1748-6653,NA,0,1,1,0,Psychology,"Psychology, Experimental",NA,WILEY,NA +journal of neuroradiology,0150-9861,1773-0406,JNeuroradiology,0,0,1,1,"Clinical Neurology | Neuroimaging | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,MASSON EDITEUR,2019-02-17 +journal of neuroscience,0270-6474,1529-2401,NA,0,0,1,0,Neurosciences,NA,NA,SOC NEUROSCIENCE,NA +journal of neuroscience methods,0165-0270,1872-678X,NA,0,0,1,0,Biochemical Research Methods | Neurosciences,NA,NA,ELSEVIER,NA +journal of neuroscience nursing,0888-0395,1945-2810,NA,0,1,1,0,Clinical Neurology | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of neuroscience nursing,0888-0395,1945-2810,NA,0,1,1,0,Clinical Neurology | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of neuroscience psychology and economics,1937-321X,2151-318X,NA,0,1,0,0,NA,"Economics | Psychology, Multidisciplinary",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +journal of neuroscience research,0360-4012,1097-4547,JNeurosciRes,0,0,1,1,Neurosciences,NA,NA,WILEY,2021-01-22 +journal of neurosurgery,0022-3085,1933-0693,TheJNS,0,0,1,1,Clinical Neurology | Surgery,NA,NA,AMER ASSOC NEUROLOGICAL SURGEONS,2009-08-11 +journal of neurosurgery-pediatrics,1933-0707,1933-0715,NA,0,0,1,0,Clinical Neurology | Pediatrics | Surgery,NA,NA,AMER ASSOC NEUROLOGICAL SURGEONS,NA +journal of neurosurgery-spine,1547-5654,1547-5646,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,AMER ASSOC NEUROLOGICAL SURGEONS,NA +journal of neurosurgical anesthesiology,0898-4921,1537-1921,JNeurosurgAnes,0,0,1,1,Anesthesiology | Clinical Neurology | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-07-27 +journal of neurosurgical sciences,0390-5616,1827-1855,JNeurosurgical,0,0,1,1,Clinical Neurology | Surgery,NA,NA,EDIZIONI MINERVA MEDICA,2019-10-31 +journal of neurotrauma,0897-7151,1557-9042,J_Neurotrauma,0,0,1,1,Critical Care Medicine | Clinical Neurology | Neurosciences,NA,NA,"MARY ANN LIEBERT, INC",2021-03-15 +journal of neurovirology,1355-0284,1538-2443,NA,0,0,1,0,Neurosciences | Virology,NA,NA,SPRINGER,NA +journal of new materials for electrochemical systems,1480-2422,2292-1168,NA,0,0,1,0,"Electrochemistry | Materials Science, Multidisciplinary",NA,NA,INT INFORMATION & ENGINEERING TECHNOLOGY ASSOC,NA +journal of new music research,0929-8215,1744-5027,NA,1,0,1,0,"Computer Science, Interdisciplinary Applications",NA,Music,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of new music research,0929-8215,1744-5027,NA,1,0,1,0,"Computer Science, Interdisciplinary Applications",NA,Music,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of nietzsche studies,0968-8005,1538-4594,NA,1,0,0,0,NA,NA,Philosophy,PENN STATE UNIV PRESS,NA +journal of nippon medical school,1345-4676,1347-3409,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MEDICAL ASSOC NIPPON MEDICAL SCH,NA +journal of non-crystalline solids,0022-3093,1873-4812,NA,0,0,1,0,"Materials Science, Ceramics | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +journal of non-equilibrium thermodynamics,0340-0204,1437-4358,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,WALTER DE GRUYTER GMBH,NA +journal of non-newtonian fluid mechanics,0377-0257,1873-2631,NA,0,0,1,0,Mechanics,NA,NA,ELSEVIER,NA +journal of noncommutative geometry,1661-6952,1661-6960,NA,0,0,1,0,"Mathematics, Applied | Mathematics | Physics, Mathematical",NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +journal of nondestructive evaluation,0195-9298,1573-4862,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of nonlinear and convex analysis,1345-4773,1880-5221,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,YOKOHAMA PUBL,NA +journal of nonlinear and variational analysis,2560-6921,2560-6778,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,BIEMDAS ACAD PUBLISHERS INC,NA +journal of nonlinear mathematical physics,1402-9251,1776-0852,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,SPRINGERNATURE,NA +journal of nonlinear optical physics & materials,0218-8635,1793-6624,NA,0,0,1,0,"Optics | Physics, Applied",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of nonlinear science,0938-8974,1432-1467,NA,0,0,1,0,"Mathematics, Applied | Mechanics | Physics, Mathematical",NA,NA,SPRINGER,NA +journal of nonparametric statistics,1048-5252,1029-0311,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of nonverbal behavior,0191-5886,1573-3653,NA,0,1,0,0,NA,"Psychology, Social",NA,SPRINGER,NA +journal of nuclear cardiology,1071-3581,1532-6551,JNCjournal,0,0,1,1,"Cardiac & Cardiovascular System | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,2019-02-21 +journal of nuclear materials,0022-3115,1873-4820,NA,0,0,1,0,"Materials Science, Multidisciplinary | Nuclear Science & Technology",NA,NA,ELSEVIER,NA +journal of nuclear medicine,0161-5505,1535-5667,JournalofNucMed,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SOC NUCLEAR MEDICINE INC,2020-10-14 +journal of nuclear science and technology,0022-3131,1881-1248,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of number theory,0022-314X,1096-1658,NA,0,0,1,0,Mathematics,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of numerical mathematics,1570-2820,1569-3953,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WALTER DE GRUYTER GMBH,NA +journal of nursing administration,0002-0443,1539-0721,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of nursing administration,0002-0443,1539-0721,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of nursing care quality,1057-3631,1550-5065,JNCQonline,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-10-25 +journal of nursing care quality,1057-3631,1550-5065,JNCQonline,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-10-25 +journal of nursing education,0148-4834,1938-2421,JNEJournal,0,1,1,1,Nursing,Nursing,NA,SLACK INC,2009-12-09 +journal of nursing education,0148-4834,1938-2421,JNEJournal,0,1,1,1,Nursing,Nursing,NA,SLACK INC,2009-12-09 +journal of nursing management,0966-0429,1365-2834,NA,0,1,1,0,Nursing,Nursing | Management,NA,WILEY,NA +journal of nursing management,0966-0429,1365-2834,NA,0,1,1,0,Nursing,Nursing | Management,NA,WILEY,NA +journal of nursing regulation,2155-8256,2155-8264,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER,NA +journal of nursing regulation,2155-8256,2155-8264,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER,NA +journal of nursing research,1682-3141,1948-965X,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of nursing research,1682-3141,1948-965X,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of nursing scholarship,1527-6546,1547-5069,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +journal of nursing scholarship,1527-6546,1547-5069,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +journal of nutrition,0022-3166,1541-6100,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,OXFORD UNIV PRESS,NA +journal of nutrition education and behavior,1499-4046,1878-2620,JNEBonline,0,0,1,1,"Education, Scientific Disciplines | Nutrition & Dietetics",NA,NA,ELSEVIER SCIENCE INC,2009-11-09 +journal of nutrition health & aging,1279-7707,1760-4788,JNHA6,0,0,1,1,Geriatrics & Gerontology | Nutrition & Dietetics,NA,NA,SPRINGER FRANCE,2018-05-24 +journal of nutritional biochemistry,0955-2863,1873-4847,NA,0,0,1,0,Biochemistry & Molecular Biology | Nutrition & Dietetics,NA,NA,ELSEVIER SCIENCE INC,NA +journal of nutritional science and vitaminology,0301-4800,1881-7742,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,CENTER ACADEMIC PUBL JAPAN,NA +journal of obsessive-compulsive and related disorders,2211-3649,2211-3657,NA,0,1,1,0,Psychiatry,Psychiatry,NA,ELSEVIER,NA +journal of obsessive-compulsive and related disorders,2211-3649,2211-3657,NA,0,1,1,0,Psychiatry,Psychiatry,NA,ELSEVIER,NA +journal of obstetrics and gynaecology,0144-3615,1364-6893,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,TAYLOR & FRANCIS INC,NA +journal of obstetrics and gynaecology research,1341-8076,1447-0756,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,WILEY,NA +journal of occupational and environmental hygiene,1545-9624,1545-9632,joeh_eds,0,0,1,1,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,TAYLOR & FRANCIS INC,2018-03-20 +journal of occupational and environmental medicine,1076-2752,1536-5948,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of occupational and organizational psychology,0963-1798,2044-8325,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,WILEY,NA +journal of occupational health,1341-9145,1348-9585,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,WILEY,NA +journal of occupational health psychology,1076-8998,1939-1307,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Psychology, Applied",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +journal of occupational medicine and toxicology,1745-6673,1745-6673,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,BMC,NA +journal of occupational rehabilitation,1053-0487,1573-3688,NA,0,1,0,0,NA,Rehabilitation | Social Issues,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of ocean engineering and science,2468-0133,2468-0133,NA,0,0,1,0,"Engineering, Marine | Engineering, Ocean",NA,NA,ELSEVIER,NA +journal of ocean university of china,1672-5182,1993-5021,JOUChina,0,0,1,1,Oceanography,NA,NA,OCEAN UNIV CHINA,2020-07-03 +journal of oceanography,0916-8370,1573-868X,J_Oceanography,0,0,1,1,Oceanography,NA,NA,SPRINGER,2022-01-14 +journal of oceanology and limnology,2096-5508,2523-3521,NA,0,0,1,0,Limnology | Oceanography,NA,NA,SCIENCE PRESS,NA +journal of ocular pharmacology and therapeutics,1080-7683,1557-7732,NA,0,0,1,0,Ophthalmology | Pharmacology & Pharmacy,NA,NA,"MARY ANN LIEBERT, INC",NA +journal of official statistics,0282-423X,0282-423X,NA,0,1,1,0,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,SCIENDO,NA +journal of official statistics,0282-423X,0282-423X,NA,0,1,1,0,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,SCIENDO,NA +journal of offshore mechanics and arctic engineering-transactions of the asme,0892-7219,1528-896X,NA,0,0,1,0,"Engineering, Ocean | Engineering, Mechanical",NA,NA,ASME,NA +journal of oil palm research,1511-2780,1511-2780,NA,0,0,1,0,Food Science & Technology,NA,NA,MALAYSIAN PALM OIL BOARD,NA +journal of oleo science,1345-8957,1347-3352,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,JAPAN OIL CHEMISTS SOC,NA +journal of oncology,1687-8450,1687-8469,NA,0,0,1,0,Oncology,NA,NA,HINDAWI LTD,NA +journal of oncology pharmacy practice,1078-1552,1477-092X,NA,0,0,1,0,Oncology | Pharmacology & Pharmacy,NA,NA,SAGE PUBLICATIONS LTD,NA +journal of operational oceanography,1755-876X,1755-8778,NA,0,0,1,0,Meteorology & Atmospheric Sciences | Oceanography,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of operational risk,1744-6740,1755-2710,NA,0,1,0,0,NA,"Business, Finance",NA,INCISIVE MEDIA,NA +journal of operations management,0272-6963,1873-1317,JournalofOpMgmt,0,1,1,1,Operations Research & Management Science,Management,NA,WILEY,2019-07-23 +journal of operations management,0272-6963,1873-1317,JournalofOpMgmt,0,1,1,1,Operations Research & Management Science,Management,NA,WILEY,2019-07-23 +journal of operator theory,0379-4024,1841-7744,NA,0,0,1,0,Mathematics,NA,NA,THETA FOUNDATION,NA +journal of ophthalmology,2090-004X,2090-0058,NA,0,0,1,0,Ophthalmology,NA,NA,HINDAWI LTD,NA +journal of optical communications and networking,1943-0620,1943-0639,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Optics | Telecommunications",NA,NA,OPTICAL SOC AMER,NA +journal of optical technology,1070-9762,1091-0786,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC AMER,NA +journal of optics,2040-8978,2040-8986,NA,0,0,1,0,Optics,NA,NA,IOP PUBLISHING LTD,NA +journal of optimization theory and applications,0022-3239,1573-2878,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of optoelectronics and advanced materials,1454-4164,1841-7132,NA,0,0,1,0,"Materials Science, Multidisciplinary | Optics | Physics, Applied",NA,NA,"NATL INST OPTOELECTRONICS",NA +journal of oral & facial pain and headache,2333-0384,2333-0376,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +journal of oral and maxillofacial surgery,0278-2391,1531-5053,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +journal of oral implantology,0160-6972,1548-1336,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ALLEN PRESS INC,NA +journal of oral microbiology,2000-2297,2000-2297,NA,0,0,1,0,Microbiology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of oral pathology & medicine,0904-2512,1600-0714,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Pathology",NA,NA,WILEY,NA +journal of oral rehabilitation,0305-182X,1365-2842,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +journal of oral science,1343-4934,1880-4926,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Materials Science, Biomaterials",NA,NA,"NIHON UNIV, SCHOOL DENTISTRY",NA +journal of organic chemistry,0022-3263,1520-6904,NA,0,0,1,0,"Chemistry, Organic",NA,NA,AMER CHEMICAL SOC,NA +journal of organizational and end user computing,1546-2234,1546-5012,JournalOEUC,0,1,1,1,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,IGI GLOBAL,2021-08-15 +journal of organizational and end user computing,1546-2234,1546-5012,JournalOEUC,0,1,1,1,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,IGI GLOBAL,2021-08-15 +journal of organizational behavior,0894-3796,1099-1379,NA,0,1,0,0,NA,"Business | Psychology, Applied | Management",NA,WILEY,NA +journal of organizational behavior management,0160-8061,1540-8604,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of organizational change management,0953-4814,1758-7816,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of organizational computing and electronic commerce,1091-9392,1532-7744,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Interdisciplinary Applications",NA,NA,TAYLOR & FRANCIS INC,NA +journal of organometallic chemistry,0022-328X,1872-8561,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,ELSEVIER SCIENCE SA,NA +journal of ornithology,2193-7192,2193-7206,NA,0,0,1,0,Ornithology,NA,NA,SPRINGER HEIDELBERG,NA +journal of orofacial orthopedics-fortschritte der kieferorthopadie,1434-5293,1615-6714,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,URBAN & VOGEL,NA +journal of orthopaedic & sports physical therapy,0190-6011,1938-1344,NA,0,0,1,0,Orthopedics | Rehabilitation | Sport Sciences,NA,NA,J O S P T,NA +journal of orthopaedic research,0736-0266,1554-527X,JOrthopRes,0,0,1,1,Orthopedics,NA,NA,WILEY,2021-08-10 +journal of orthopaedic science,0949-2658,1436-2023,NA,0,0,1,0,Orthopedics,NA,NA,ELSEVIER,NA +journal of orthopaedic surgery,1022-5536,2309-4990,JOrthoSurgery,0,0,1,1,Orthopedics | Surgery,NA,NA,SAGE PUBLICATIONS LTD,2020-07-09 +journal of orthopaedic surgery and research,1749-799X,1749-799X,NA,0,0,1,0,Orthopedics,NA,NA,BMC,NA +journal of orthopaedic translation,2214-031X,2214-031X,JOrthoTransl,0,0,1,1,Orthopedics,NA,NA,ELSEVIER,2017-11-27 +journal of orthopaedic trauma,0890-5339,1531-2291,JofOrthoTrauma,0,0,1,1,Orthopedics | Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-06-20 +journal of orthopaedics and traumatology,1590-9921,1590-9999,NA,0,0,1,0,Orthopedics,NA,NA,SPRINGER,NA +journal of otolaryngology-head & neck surgery,1916-0216,1916-0216,JournalOHNS,0,0,1,1,Otorhinolaryngology,NA,NA,BMC,NA +journal of outdoor recreation and tourism-research planning and management,2213-0780,2213-0799,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,ELSEVIER,NA +journal of ovarian research,1757-2215,1757-2215,NA,0,0,1,0,Reproductive Biology,NA,NA,BMC,NA +journal of ovonic research,1842-2403,1584-9953,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,VIRTUAL CO PHYSICS SRL,NA +journal of pacific history,0022-3344,1469-9605,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of pacific rim psychology,1834-4909,1834-4909,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS LTD,NA +journal of paediatrics and child health,1034-4810,1440-1754,JPCHonline,0,0,1,1,Pediatrics,NA,NA,WILEY,2013-11-01 +journal of pain,1526-5900,1528-8447,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,CHURCHILL LIVINGSTONE,NA +journal of pain and symptom management,0885-3924,1873-6513,JPSMjournal,0,0,1,1,"Health Care Sciences & Services | Medicine, General & Internal | Clinical Neurology",NA,NA,ELSEVIER SCIENCE INC,2016-08-02 +journal of pain research,1178-7090,1178-7090,JPainResearch,0,0,1,1,Clinical Neurology,NA,NA,DOVE MEDICAL PRESS LTD,2021-06-29 +journal of palaeogeography-english,2095-3836,2524-4507,NA,0,0,1,0,"Geosciences, Multidisciplinary | Paleontology",NA,NA,SPRINGER SINGAPORE PTE LTD,NA +journal of paleolimnology,0921-2728,1573-0417,NA,0,0,1,0,"Environmental Sciences | Geosciences, Multidisciplinary | Limnology",NA,NA,SPRINGER,NA +journal of paleontology,0022-3360,1937-2337,NA,0,0,1,0,Paleontology,NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of palestine studies,0377-919X,1533-8614,palstudies,0,1,0,1,NA,Area Studies,NA,TAYLOR & FRANCIS LTD,2010-02-26 +journal of palliative care,0825-8597,2369-5293,JPalliativeCare,0,1,1,1,Health Care Sciences & Services,"Health Policy & Services | Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,2017-07-26 +journal of palliative care,0825-8597,2369-5293,JPalliativeCare,0,1,1,1,Health Care Sciences & Services,"Health Policy & Services | Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,2017-07-26 +journal of palliative medicine,1096-6218,1557-7740,PalliativeMed_j,0,0,1,1,Health Care Sciences & Services,NA,NA,"MARY ANN LIEBERT, INC",2010-10-01 +journal of parallel and distributed computing,0743-7315,1096-0848,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of parasitology,0022-3395,1937-2345,NA,0,0,1,0,Parasitology,NA,NA,ALLEN PRESS INC,NA +journal of parenteral and enteral nutrition,0148-6071,1941-2444,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,WILEY,NA +journal of parkinsons disease,1877-7171,1877-718X,journal_PD,0,0,1,1,Neurosciences,NA,NA,IOS PRESS,2016-06-21 +journal of pathology,0022-3417,1096-9896,JPathology,0,0,1,1,Oncology | Pathology,NA,NA,WILEY,NA +journal of pathology clinical research,2056-4538,2056-4538,NA,0,0,1,0,Pathology,NA,NA,WILEY,NA +journal of patient safety,1549-8417,1549-8425,JPatientSafety,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-12-09 +journal of patient safety,1549-8417,1549-8425,JPatientSafety,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-12-09 +journal of peace research,0022-3433,1460-3578,jpr_journal,0,1,0,1,NA,International Relations | Political Science,NA,SAGE PUBLICATIONS LTD,2013-03-21 +journal of peasant studies,0306-6150,1743-9361,Peasant_Journal,0,1,0,1,NA,Anthropology | Development Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-05-13 +journal of pediatric and adolescent gynecology,1083-3188,1873-4332,NA,0,0,1,0,Obstetrics & Gynecology | Pediatrics,NA,NA,ELSEVIER SCIENCE INC,NA +journal of pediatric endocrinology & metabolism,0334-018X,2191-0251,NA,0,0,1,0,Endocrinology & Metabolism | Pediatrics,NA,NA,WALTER DE GRUYTER GMBH,NA +journal of pediatric gastroenterology and nutrition,0277-2116,1536-4801,NA,0,0,1,0,Gastroenterology & Hepatology | Nutrition & Dietetics | Pediatrics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of pediatric health care,0891-5245,1532-656X,NA,0,1,1,0,Nursing | Pediatrics,Nursing | Health Policy & Services,NA,ELSEVIER SCIENCE INC,NA +journal of pediatric health care,0891-5245,1532-656X,NA,0,1,1,0,Nursing | Pediatrics,Nursing | Health Policy & Services,NA,ELSEVIER SCIENCE INC,NA +journal of pediatric hematology oncology,1077-4114,1536-3678,NA,0,0,1,0,Oncology | Hematology | Pediatrics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of pediatric infectious diseases,1305-7707,1305-7693,NA,0,0,1,0,Infectious Diseases | Pediatrics,NA,NA,GEORG THIEME VERLAG KG,NA +journal of pediatric nursing-nursing care of children & families,0882-5963,0882-5963,NA,0,1,1,0,Nursing | Pediatrics,Nursing,NA,ELSEVIER SCIENCE INC,NA +journal of pediatric nursing-nursing care of children & families,0882-5963,0882-5963,NA,0,1,1,0,Nursing | Pediatrics,Nursing,NA,ELSEVIER SCIENCE INC,NA +journal of pediatric oncology nursing,1043-4542,1532-8457,NA,0,1,1,0,Oncology | Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +journal of pediatric oncology nursing,1043-4542,1532-8457,NA,0,1,1,0,Oncology | Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +journal of pediatric ophthalmology & strabismus,0191-3913,1938-2405,JPOSJournal,0,0,1,1,Ophthalmology | Pediatrics,NA,NA,SLACK INC,2009-12-10 +journal of pediatric orthopaedics,0271-6798,1539-2570,NA,0,0,1,0,Orthopedics | Pediatrics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of pediatric orthopaedics-part b,1060-152X,1473-5865,NA,0,0,1,0,Orthopedics | Pediatrics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of pediatric psychology,0146-8693,1465-735X,JPedPsych,0,1,0,1,NA,"Psychology, Development",NA,OXFORD UNIV PRESS INC,2017-04-21 +journal of pediatric surgery,0022-3468,1531-5037,NA,0,0,1,0,Pediatrics | Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +journal of pediatric urology,1477-5131,1873-4898,jpurology,0,0,1,1,Pediatrics | Urology & Nephrology,NA,NA,ELSEVIER SCI LTD,2015-11-18 +journal of pediatrics,0022-3476,1097-6833,JPediatr,0,0,1,1,Pediatrics,NA,NA,MOSBY-ELSEVIER,2014-07-21 +journal of pension economics & finance,1474-7472,1475-3022,PensionsJournal,0,1,0,1,NA,"Business, Finance | Economics",NA,CAMBRIDGE UNIV PRESS,2010-01-28 +journal of peptide science,1075-2617,1099-1387,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Analytical",NA,NA,WILEY,NA +journal of performance of constructed facilities,0887-3828,1943-5509,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of perianesthesia nursing,1089-9472,1532-8473,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +journal of perianesthesia nursing,1089-9472,1532-8473,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,NA +journal of perinatal & neonatal nursing,0893-2190,1550-5073,NA,0,1,1,0,Nursing | Obstetrics & Gynecology | Pediatrics,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of perinatal & neonatal nursing,0893-2190,1550-5073,NA,0,1,1,0,Nursing | Obstetrics & Gynecology | Pediatrics,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of perinatal medicine,0300-5577,1619-3997,NA,0,0,1,0,Obstetrics & Gynecology | Pediatrics,NA,NA,WALTER DE GRUYTER GMBH,NA +journal of perinatology,0743-8346,1476-5543,JPerinatology,0,0,1,1,Obstetrics & Gynecology | Pediatrics,NA,NA,SPRINGERNATURE,2018-05-24 +journal of periodontal and implant science,2093-2278,2093-2286,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,KOREAN ACAD PERIODONTOLOGY,NA +journal of periodontal research,0022-3484,1600-0765,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +journal of periodontology,0022-3492,1943-3670,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +journal of personality,0022-3506,1467-6494,NA,0,1,0,0,NA,"Psychology, Social",NA,WILEY,NA +journal of personality and social psychology,0022-3514,1939-1315,NA,0,1,0,0,NA,"Psychology, Social",NA,AMER PSYCHOLOGICAL ASSOC,NA +journal of personality assessment,0022-3891,1532-7752,NA,0,1,0,0,NA,"Psychology, Clinical | Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of personality disorders,0885-579X,1943-2763,NA,0,1,0,0,NA,Psychiatry,NA,GUILFORD PUBLICATIONS INC,NA +journal of personalized medicine,2075-4426,2075-4426,NA,0,0,1,0,"Health Care Sciences & Services | Medicine, General & Internal",NA,NA,MDPI,NA +journal of personnel psychology,1866-5888,2190-5150,jpersonnelpsych,0,1,0,1,NA,"Psychology, Applied",NA,HOGREFE PUBLISHING CORP,2020-01-02 +journal of pest science,1612-4758,1612-4766,NA,0,0,1,0,Entomology,NA,NA,SPRINGER HEIDELBERG,NA +journal of pesticide science,1348-589X,1349-0923,NA,0,0,1,0,Entomology,NA,NA,PESTICIDE SCI SOC JAPAN,NA +journal of petroleum exploration and production technology,2190-0558,2190-0566,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum | Geosciences, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +journal of petroleum geology,0141-6421,1747-5457,JournPetrolGeol,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,WILEY,2020-05-04 +journal of petroleum science and engineering,0920-4105,1873-4715,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum",NA,NA,ELSEVIER,NA +journal of petrology,0022-3530,1460-2415,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,OXFORD UNIV PRESS,NA +journal of pharmaceutical analysis,2095-1779,2214-0883,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +journal of pharmaceutical and biomedical analysis,0731-7085,1873-264X,NA,0,0,1,0,"Chemistry, Analytical | Pharmacology & Pharmacy",NA,NA,ELSEVIER,NA +journal of pharmaceutical innovation,1872-5120,1939-8042,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGER,NA +journal of pharmaceutical investigation,2093-5552,2093-6214,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGERNATURE,NA +journal of pharmaceutical sciences,0022-3549,1520-6017,JPharmSciences,0,0,1,1,"Chemistry, Medicinal | Chemistry, Multidisciplinary | Pharmacology & Pharmacy",NA,NA,ELSEVIER SCIENCE INC,2019-04-26 +journal of pharmaceutical sciences,0022-3549,1520-6017,JPharmSciences,0,0,1,1,"Chemistry, Medicinal | Chemistry, Multidisciplinary | Pharmacology & Pharmacy",NA,NA,ELSEVIER SCIENCE INC,2019-04-26 +journal of pharmacokinetics and pharmacodynamics,1567-567X,1573-8744,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of pharmacological and toxicological methods,1056-8719,1873-488X,NA,0,0,1,0,Pharmacology & Pharmacy | Toxicology,NA,NA,ELSEVIER SCIENCE INC,NA +journal of pharmacological sciences,1347-8613,1347-8648,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,JAPANESE PHARMACOLOGICAL SOC,NA +journal of pharmacology and experimental therapeutics,0022-3565,1521-0103,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,AMER SOC PHARMACOLOGY EXPERIMENTAL THERAPEUTICS,NA +journal of pharmacy and pharmaceutical sciences,1482-1826,1482-1826,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,CANADIAN SOC PHARMACEUTICAL SCIENCES,NA +journal of pharmacy and pharmacology,0022-3573,2042-7158,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,OXFORD UNIV PRESS,NA +journal of phase equilibria and diffusion,1547-7037,1863-7345,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,SPRINGER,NA +journal of philosophical logic,0022-3611,1573-0433,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +journal of philosophical research,1053-8364,2153-7984,NA,1,0,0,0,NA,NA,Philosophy,PHILOSOPHY DOCUMENTATION CENTER,NA +journal of philosophy,0022-362X,1939-8549,NA,1,0,0,0,NA,NA,Philosophy,J PHILOSOPHY INC,NA +journal of philosophy of education,0309-8249,1467-9752,JPhilofEd,0,1,0,1,NA,Education & Educational Research | History Of Social Sciences,NA,WILEY,2018-02-03 +journal of phonetics,0095-4470,1095-8576,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of phonetics,0095-4470,1095-8576,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of photochemistry and photobiology a-chemistry,1010-6030,1873-2666,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER SCIENCE SA,NA +journal of photochemistry and photobiology b-biology,1011-1344,1873-2682,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,ELSEVIER SCIENCE SA,NA +journal of photochemistry and photobiology c-photochemistry reviews,1389-5567,1873-2739,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER,NA +journal of photonics for energy,1947-7988,1947-7988,NA,0,0,1,0,"Materials Science, Multidisciplinary | Optics | Physics, Applied",NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +journal of photopolymer science and technology,0914-9244,1349-6336,NA,0,0,1,0,Polymer Science,NA,NA,"TECHNICAL ASSOC PHOTOPOLYMERS,JAPAN",NA +journal of phycology,0022-3646,1529-8817,JPhycology,0,0,1,1,Plant Sciences | Marine & Freshwater Biology,NA,NA,WILEY,NA +journal of physical activity & health,1543-3080,1543-5474,JPAHjournal,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,HUMAN KINETICS PUBL INC,2014-06-17 +journal of physical and chemical reference data,0047-2689,1529-7845,NA,0,0,1,0,"Chemistry, Multidisciplinary | Chemistry, Physical | Physics, Multidisciplinary",NA,NA,AIP PUBLISHING,NA +journal of physical chemistry a,1089-5639,1520-5215,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,AMER CHEMICAL SOC,NA +journal of physical chemistry b,1520-6106,1520-5207,NA,0,0,1,0,"Chemistry, Physical",NA,NA,AMER CHEMICAL SOC,NA +journal of physical chemistry c,1932-7447,1932-7455,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,NA +journal of physical chemistry letters,1948-7185,1948-7185,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Atomic, Molecular & Chemical",NA,NA,AMER CHEMICAL SOC,NA +journal of physical oceanography,0022-3670,1520-0485,AMSJPO,0,0,1,1,Oceanography,NA,NA,AMER METEOROLOGICAL SOC,2020-10-02 +journal of physical organic chemistry,0894-3230,1099-1395,NA,0,0,1,0,"Chemistry, Organic | Chemistry, Physical",NA,NA,WILEY,NA +journal of physics-condensed matter,0953-8984,1361-648X,JPhysCM,0,0,1,1,"Physics, Condensed Matter",NA,NA,IOP PUBLISHING LTD,2018-05-22 +journal of physics-energy,2515-7655,2515-7655,NA,0,0,1,0,"Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +journal of physics a-mathematical and theoretical,1751-8113,1751-8121,JPhysA,0,0,1,1,"Physics, Multidisciplinary | Physics, Mathematical",NA,NA,IOP PUBLISHING LTD,2011-02-03 +journal of physics and chemistry of solids,0022-3697,1879-2553,NA,0,0,1,0,"Chemistry, Multidisciplinary | Physics, Condensed Matter",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of physics b-atomic molecular and optical physics,0953-4075,1361-6455,JPhysB,0,0,1,1,"Optics | Physics, Atomic, Molecular & Chemical",NA,NA,IOP PUBLISHING LTD,2013-07-09 +journal of physics d-applied physics,0022-3727,1361-6463,JPhysD,0,0,1,1,"Physics, Applied",NA,NA,IOP PUBLISHING LTD,2009-10-12 +journal of physics g-nuclear and particle physics,0954-3899,1361-6471,jphysg,0,0,1,1,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,IOP PUBLISHING LTD,2018-03-23 +journal of physiological anthropology,1880-6805,1880-6805,NA,0,0,1,0,Physiology,NA,NA,BMC,NA +journal of physiological sciences,1880-6546,1880-6562,NA,0,0,1,0,Physiology,NA,NA,BMC,NA +journal of physiology-london,0022-3751,1469-7793,JPhysiol,0,0,1,1,Neurosciences | Physiology,NA,NA,WILEY,2010-11-24 +journal of physiology and biochemistry,1138-7548,1877-8755,JPBY_official,0,0,1,1,Biochemistry & Molecular Biology | Physiology,NA,NA,SPRINGER,2020-02-05 +journal of physiology and pharmacology,0867-5910,1899-1505,NA,0,0,1,0,Physiology,NA,NA,POLISH PHYSIOLOGICAL SOC,NA +journal of physiotherapy,1836-9553,1836-9561,JPhysiother,0,0,1,1,Orthopedics | Rehabilitation,NA,NA,AUSTRALIAN PHYSIOTHERAPY ASSOC,2019-04-23 +journal of phytopathology,0931-1785,1439-0434,NA,0,0,1,0,Plant Sciences,NA,NA,WILEY,NA +journal of pidgin and creole languages,0920-9034,1569-9870,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +journal of pidgin and creole languages,0920-9034,1569-9870,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +journal of pineal research,0742-3098,1600-079X,NA,0,0,1,0,Endocrinology & Metabolism | Neurosciences | Physiology,NA,NA,WILEY,NA +journal of pipeline systems engineering and practice,1949-1190,1949-1204,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of plankton research,0142-7873,1464-3774,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,OXFORD UNIV PRESS,NA +journal of planning education and research,0739-456X,1552-6577,NA,0,1,0,0,NA,Regional & Urban Planning | Urban Studies,NA,SAGE PUBLICATIONS INC,NA +journal of planning literature,0885-4122,1552-6593,JPL_SAGE,0,1,0,1,NA,Regional & Urban Planning | Urban Studies,NA,SAGE PUBLICATIONS INC,2020-05-21 +journal of plant biochemistry and biotechnology,0971-7811,0974-1275,NA,0,0,1,0,Biochemistry & Molecular Biology | Plant Sciences,NA,NA,SPRINGER INDIA,NA +journal of plant biology,1226-9239,1867-0725,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER HEIDELBERG,NA +journal of plant diseases and protection,1861-3829,1861-3837,NA,0,0,1,0,"Agriculture, Multidisciplinary | Plant Sciences",NA,NA,SPRINGER HEIDELBERG,NA +journal of plant ecology,1752-9921,1752-993X,JPlantEcol,0,0,1,1,Plant Sciences | Ecology | Forestry,NA,NA,OXFORD UNIV PRESS,2013-08-19 +journal of plant growth regulation,0721-7595,1435-8107,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +journal of plant interactions,1742-9145,1742-9153,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of plant nutrition,0190-4167,1532-4087,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS INC,NA +journal of plant nutrition and soil science,1436-8730,1522-2624,NA,0,0,1,0,Agronomy | Plant Sciences | Soil Science,NA,NA,WILEY-V C H VERLAG GMBH,NA +journal of plant pathology,1125-4653,2239-7264,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +journal of plant physiology,0176-1617,1618-1328,JPlantPhysiol,0,0,1,1,Plant Sciences,NA,NA,ELSEVIER GMBH,2021-05-26 +journal of plant registrations,1936-5209,1940-3496,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,WILEY,NA +journal of plant research,0918-9440,1618-0860,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER JAPAN KK,NA +journal of plasma physics,0022-3778,1469-7807,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of plastic film & sheeting,8756-0879,1530-8014,NA,0,0,1,0,"Materials Science, Coatings & Films",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of plastic reconstructive and aesthetic surgery,1748-6815,1878-0539,NA,0,0,1,0,Surgery,NA,NA,ELSEVIER SCI LTD,NA +journal of plastic surgery and hand surgery,2000-656X,2000-6764,NA,0,0,1,0,Orthopedics | Surgery,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of policy analysis and management,0276-8739,1520-6688,JPAM_DC,0,1,0,1,NA,Economics | Public Administration,NA,WILEY,2015-05-18 +journal of policy and practice in intellectual disabilities,1741-1122,1741-1130,NA,0,1,0,0,NA,Health Policy & Services | Rehabilitation,NA,WILEY,NA +journal of policy history,0898-0306,1528-4190,NA,1,1,0,0,NA,History | Political Science,History,CAMBRIDGE UNIV PRESS,NA +journal of policy history,0898-0306,1528-4190,NA,1,1,0,0,NA,History | Political Science,History,CAMBRIDGE UNIV PRESS,NA +journal of policy modeling,0161-8938,1873-8060,NA,0,1,0,0,NA,Economics,NA,ELSEVIER SCIENCE INC,NA +journal of politeness research-language behaviour culture,1612-5681,1613-4877,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +journal of politeness research-language behaviour culture,1612-5681,1613-4877,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +journal of political economy,0022-3808,1537-534X,JPolEcon,0,1,0,1,NA,Economics,NA,UNIV CHICAGO PRESS,2012-10-23 +journal of political ideologies,1356-9317,1469-9613,jpolideologies,0,1,0,1,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-01-04 +journal of political philosophy,0963-8016,1467-9760,jppjournal,0,1,0,1,NA,Ethics | Political Science,NA,WILEY,2017-06-22 +journal of politics,0022-3816,1468-2508,the_jop,0,1,0,1,NA,Political Science,NA,UNIV CHICAGO PRESS,2014-12-18 +journal of polymer engineering,0334-6447,2191-0340,NA,0,0,1,0,Polymer Science,NA,NA,WALTER DE GRUYTER GMBH,NA +journal of polymer materials,0973-8622,0973-8622,NA,0,0,1,0,Polymer Science,NA,NA,PRINTS PUBLICATIONS PVT LTD,NA +journal of polymer research,1022-9760,1572-8935,NA,0,0,1,0,Polymer Science,NA,NA,SPRINGER,NA +journal of polymer science,2642-4150,2642-4169,JPolymSci,0,0,1,1,Polymer Science,NA,NA,WILEY,2010-04-16 +journal of polymers and the environment,1566-2543,1572-8919,NA,0,0,1,0,"Engineering, Environmental | Polymer Science",NA,NA,SPRINGER,NA +journal of popular culture,0022-3840,1540-5931,NA,1,1,0,0,NA,Cultural Studies,"Cultural Studies | Humanities, Multidisciplinary",WILEY,NA +journal of popular culture,0022-3840,1540-5931,NA,1,1,0,0,NA,Cultural Studies,"Cultural Studies | Humanities, Multidisciplinary",WILEY,NA +journal of popular film and television,0195-6051,1930-6458,NA,1,0,0,0,NA,NA,"Film, Radio, Television","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of popular music studies,1524-2226,1533-1598,JPMS_Pop,1,0,0,1,NA,NA,Music,UNIV CALIFORNIA PRESS,2018-07-02 +journal of population economics,0933-1433,1432-1475,NA,0,1,0,0,NA,Demography | Economics,NA,SPRINGER,NA +journal of porous materials,1380-2224,1573-4854,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +journal of porous media,1091-028X,1934-0508,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical | Mechanics",NA,NA,BEGELL HOUSE INC,NA +journal of porphyrins and phthalocyanines,1088-4246,1099-1409,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of portfolio management,0095-4918,2168-8656,NA,0,1,0,0,NA,"Business, Finance",NA,PAGEANT MEDIA LTD,NA +journal of positive behavior interventions,1098-3007,1538-4772,TheJPBI,0,1,0,1,NA,"Psychology, Clinical | Education, Special",NA,SAGE PUBLICATIONS INC,2021-12-14 +journal of positive psychology,1743-9760,1743-9779,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of post keynesian economics,0160-3477,1557-7821,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of postcolonial writing,1744-9855,1744-9863,Routledge_JPW,1,0,0,1,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-05-24 +journal of postgraduate medicine,0022-3859,0972-2823,jpgmonline,0,0,1,1,"Medicine, General & Internal",NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2021-09-14 +journal of poultry science,1346-7395,1349-0486,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,JAPAN POULTRY SCIENCE ASSOC,NA +journal of poverty and social justice,1759-8273,1759-8281,NA,0,1,0,0,NA,"Social Issues | Social Sciences, Interdisciplinary",NA,POLICY PRESS,NA +journal of power electronics,1598-2092,2093-4718,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,SPRINGER HEIDELBERG,NA +journal of power sources,0378-7753,1873-2755,NA,0,0,1,0,"Chemistry, Physical | Electrochemistry | Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +journal of pragmatics,0378-2166,1879-1387,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ELSEVIER,NA +journal of pragmatics,0378-2166,1879-1387,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ELSEVIER,NA +journal of pre-raphaelite studies-new series,1060-149X,NA,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",JOURNAL PRE-RAPHAELITE STUDIES,NA +journal of presbyterian history,1521-9216,1521-9216,NA,1,0,0,0,NA,NA,Religion,PRESBYTERIAN HISTORICAL SOC,NA +journal of pressure vessel technology-transactions of the asme,0094-9930,1528-8978,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASME,NA +journal of primary prevention,0278-095X,1573-6547,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SPRINGER,NA +journal of process control,0959-1524,1873-2771,NA,0,0,1,0,"Automation & Control Systems | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +journal of product and brand management,1061-0421,2054-1643,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of product innovation management,0737-6782,1540-5885,JournalPIM,0,1,1,1,"Engineering, Industrial",Business | Management,NA,WILEY,2015-02-11 +journal of product innovation management,0737-6782,1540-5885,JournalPIM,0,1,1,1,"Engineering, Industrial",Business | Management,NA,WILEY,2015-02-11 +journal of productivity analysis,0895-562X,1573-0441,NA,0,1,0,0,NA,"Business | Economics | Social Sciences, Mathematical Methods",NA,SPRINGER,NA +journal of professional capital and community,2056-9548,2056-9556,JPCCJournal,0,1,0,1,NA,Education & Educational Research,NA,EMERALD GROUP PUBLISHING LTD,2015-06-08 +journal of professional nursing,8755-7223,1532-8481,NA,0,1,1,0,Nursing,Nursing,NA,W B SAUNDERS CO-ELSEVIER INC,NA +journal of professional nursing,8755-7223,1532-8481,NA,0,1,1,0,Nursing,Nursing,NA,W B SAUNDERS CO-ELSEVIER INC,NA +journal of propulsion and power,0748-4658,1533-3876,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,AMER INST AERONAUTICS ASTRONAUTICS,NA +journal of prosthetic dentistry,0022-3913,1097-6841,JPDentistry,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,MOSBY-ELSEVIER,2021-02-03 +journal of prosthodontic research,1883-1958,2212-4632,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,JAPAN PROSTHODONTIC SOC,NA +journal of prosthodontics-implant esthetic and reconstructive dentistry,1059-941X,1532-849X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +journal of proteome research,1535-3893,1535-3907,JProteomeRes,0,0,1,1,Biochemical Research Methods,NA,NA,AMER CHEMICAL SOC,2018-05-16 +journal of proteomics,1874-3919,1876-7737,NA,0,0,1,0,Biochemical Research Methods,NA,NA,ELSEVIER,NA +journal of pseudo-differential operators and applications,1662-9981,1662-999X,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +journal of psychiatric and mental health nursing,1351-0126,1365-2850,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,WILEY,NA +journal of psychiatric and mental health nursing,1351-0126,1365-2850,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,WILEY,NA +journal of psychiatric practice,1527-4160,1538-1145,NA,0,0,1,0,Psychiatry,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of psychiatric research,0022-3956,1879-1379,NA,0,1,1,0,Psychiatry,Psychiatry,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of psychiatric research,0022-3956,1879-1379,NA,0,1,1,0,Psychiatry,Psychiatry,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of psychiatry & neuroscience,1180-4882,1488-2434,NA,0,1,1,0,Neurosciences | Psychiatry,Psychiatry,NA,CMA-CANADIAN MEDICAL ASSOC,NA +journal of psychiatry & neuroscience,1180-4882,1488-2434,NA,0,1,1,0,Neurosciences | Psychiatry,Psychiatry,NA,CMA-CANADIAN MEDICAL ASSOC,NA +journal of psychoactive drugs,0279-1072,2159-9777,NA,0,1,0,0,NA,"Psychology, Clinical | Substance Abuse",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of psychoeducational assessment,0734-2829,1557-5144,NA,0,1,0,0,NA,"Psychology, Educational",NA,SAGE PUBLICATIONS INC,NA +journal of psycholinguistic research,0090-6905,1573-6555,NA,0,1,0,0,NA,"Linguistics | Psychology, Experimental",NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of psychologists and counsellors in schools,2055-6365,2055-6373,NA,0,1,0,0,NA,Education & Educational Research | Social Work,NA,CAMBRIDGE UNIV PRESS,NA +journal of psychology,0022-3980,1940-1019,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of psychology and theology,0091-6471,2328-1162,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Religion,SAGE PUBLICATIONS INC,NA +journal of psychology and theology,0091-6471,2328-1162,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Religion,SAGE PUBLICATIONS INC,NA +journal of psychology in africa,1433-0237,1815-5626,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of psychopathology and behavioral assessment,0882-2689,1573-3505,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of psychopharmacology,0269-8811,1461-7285,NA,0,0,1,0,Clinical Neurology | Neurosciences | Pharmacology & Pharmacy | Psychiatry,NA,NA,SAGE PUBLICATIONS LTD,NA +journal of psychophysiology,0269-8803,2151-2124,NA,0,1,1,0,Neurosciences,"Psychology, Biological",NA,HOGREFE PUBLISHING CORP,NA +journal of psychophysiology,0269-8803,2151-2124,NA,0,1,1,0,Neurosciences,"Psychology, Biological",NA,HOGREFE PUBLISHING CORP,NA +journal of psychosocial nursing and mental health services,0279-3695,1938-2413,JPNJournal,0,1,1,1,Nursing,Nursing,NA,SLACK INC,2009-12-10 +journal of psychosocial nursing and mental health services,0279-3695,1938-2413,JPNJournal,0,1,1,1,Nursing,Nursing,NA,SLACK INC,2009-12-10 +journal of psychosocial oncology,0734-7332,1540-7586,JPsychSocOnc,0,1,0,1,NA,"Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-06-02 +journal of psychosomatic obstetrics & gynecology,0167-482X,1743-8942,NA,0,1,1,0,Obstetrics & Gynecology | Psychiatry,"Psychology, Clinical",NA,TAYLOR & FRANCIS LTD,NA +journal of psychosomatic obstetrics & gynecology,0167-482X,1743-8942,NA,0,1,1,0,Obstetrics & Gynecology | Psychiatry,"Psychology, Clinical",NA,TAYLOR & FRANCIS LTD,NA +journal of psychosomatic research,0022-3999,1879-1360,J_Psychosom_Res,0,1,1,1,Psychiatry,Psychiatry,NA,PERGAMON-ELSEVIER SCIENCE LTD,2018-07-20 +journal of psychosomatic research,0022-3999,1879-1360,J_Psychosom_Res,0,1,1,1,Psychiatry,Psychiatry,NA,PERGAMON-ELSEVIER SCIENCE LTD,2018-07-20 +journal of public administration research and theory,1053-1858,1477-9803,jpart1991,0,1,0,1,NA,Political Science | Public Administration,NA,OXFORD UNIV PRESS,2019-04-12 +journal of public child welfare,1554-8732,1554-8740,JPChildWelfare,0,1,0,1,NA,Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-10-08 +journal of public economic theory,1097-3923,1467-9779,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +journal of public economics,0047-2727,0047-2727,JPubEcon,0,1,0,1,NA,Economics,NA,ELSEVIER SCIENCE SA,2018-11-02 +journal of public health,1741-3842,1741-3850,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +journal of public health,1741-3842,1741-3850,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +journal of public health dentistry,0022-4006,1752-7325,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Public, Environmental & Occupational Health",NA,NA,WILEY,NA +journal of public health management and practice,1078-4659,1550-5022,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of public health policy,0197-5897,1745-655X,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,PALGRAVE MACMILLAN LTD,NA +journal of public health policy,0197-5897,1745-655X,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,PALGRAVE MACMILLAN LTD,NA +journal of public policy,0143-814X,1469-7815,jpublicpolicy,0,1,0,1,NA,Political Science | Public Administration,NA,CAMBRIDGE UNIV PRESS,2011-11-30 +journal of public policy & marketing,0743-9156,1547-7207,AMA_JPPM,0,1,0,1,NA,Business,NA,SAGE PUBLICATIONS INC,NA +journal of public relations research,1062-726X,1532-754X,NA,0,1,0,0,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of public transportation,1077-291X,2375-0901,NA,0,1,0,0,NA,Transportation,NA,CENTER URBAN TRANSPORTATION RESEARCH,NA +journal of purchasing and supply management,1478-4092,1873-6505,NA,0,1,0,0,NA,Management,NA,ELSEVIER SCI LTD,NA +journal of pure and applied algebra,0022-4049,1873-1376,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ELSEVIER,NA +journal of quality technology,0022-4065,2575-6230,NA,0,0,1,0,"Engineering, Industrial | Operations Research & Management Science | Statistics & Probability",NA,NA,TAYLOR & FRANCIS INC,NA +journal of quantitative criminology,0748-4518,1573-7799,NA,0,1,0,0,NA,Criminology & Penology,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of quantitative linguistics,0929-6174,1744-5035,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of quantitative linguistics,0929-6174,1744-5035,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of quantitative spectroscopy & radiative transfer,0022-4073,1879-1352,NA,0,0,1,0,Optics | Spectroscopy,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of quaternary science,0267-8179,1099-1417,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,WILEY,NA +journal of quranic studies,1465-3591,1755-1730,NA,1,0,0,0,NA,NA,Religion,EDINBURGH UNIV PRESS,NA +journal of racial and ethnic health disparities,2197-3792,2196-8837,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SPRINGER INT PUBL AG,NA +journal of radiation research,0449-3060,1349-9157,NA,0,0,1,0,"Biology | Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,OXFORD UNIV PRESS,NA +journal of radiation research and applied sciences,1687-8507,1687-8507,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of radioanalytical and nuclear chemistry,0236-5731,1588-2780,NA,0,0,1,0,"Chemistry, Analytical | Chemistry, Inorganic & Nuclear | Nuclear Science & Technology",NA,NA,SPRINGER,NA +journal of radiological protection,0952-4746,1361-6498,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health | Nuclear Science & Technology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,IOP PUBLISHING LTD,NA +journal of raman spectroscopy,0377-0486,1097-4555,NA,0,0,1,0,Spectroscopy,NA,NA,WILEY,NA +journal of raptor research,0892-1016,2162-4569,NA,0,0,1,0,Ornithology,NA,NA,RAPTOR RESEARCH FOUNDATION INC,NA +journal of rare earths,1002-0721,1002-0721,NA,0,0,1,0,"Chemistry, Applied",NA,NA,ELSEVIER,NA +journal of rational-emotive and cognitive-behavior therapy,0894-9085,1573-6563,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER,NA +journal of real-time image processing,1861-8200,1861-8219,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic | Imaging Science & Photographic Technology",NA,NA,SPRINGER HEIDELBERG,NA +journal of real estate finance and economics,0895-5638,1573-045X,NA,0,1,0,0,NA,"Business, Finance | Economics | Urban Studies",NA,SPRINGER,NA +journal of real estate research,0896-5803,2691-1175,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,TAYLOR & FRANCIS INC,NA +journal of receptors and signal transduction,1079-9893,1532-4281,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of reconstructive microsurgery,0743-684X,1098-8947,NA,0,0,1,0,Surgery,NA,NA,THIEME MEDICAL PUBL INC,NA +journal of refractive surgery,1081-597X,1938-2391,NA,0,0,1,0,Ophthalmology | Surgery,NA,NA,SLACK INC,NA +journal of refugee studies,0951-6328,1471-6925,JRefugeeStudies,0,1,0,1,NA,Demography | Ethnic Studies,NA,OXFORD UNIV PRESS,2021-10-27 +journal of regional science,0022-4146,1467-9787,JRS83202671,0,1,0,1,NA,Economics | Environmental Studies | Regional & Urban Planning,NA,WILEY,2022-02-05 +journal of regulatory economics,0922-680X,1573-0468,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +journal of rehabilitation,0022-4154,1607-2960,NA,0,1,0,0,NA,Rehabilitation,NA,"NATL REHABILITATION ASSOC-NRA",NA +journal of rehabilitation medicine,1650-1977,1651-2081,NA,0,0,1,0,Rehabilitation | Sport Sciences,NA,NA,FOUNDATION REHABILITATION INFORMATION,NA +journal of reinforced plastics and composites,0731-6844,1530-7964,NA,0,0,1,0,"Materials Science, Composites | Polymer Science",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of religion,0022-4189,1549-6538,NA,1,0,0,0,NA,NA,Religion,UNIV CHICAGO PRESS,NA +journal of religion & health,0022-4197,1573-6571,NA,1,1,0,0,NA,"Public, Environmental & Occupational Health",Religion,SPRINGER,NA +journal of religion & health,0022-4197,1573-6571,NA,1,1,0,0,NA,"Public, Environmental & Occupational Health",Religion,SPRINGER,NA +journal of religion in africa,0022-4200,1570-0666,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +journal of religious ethics,0384-9694,1467-9795,NA,1,0,0,0,NA,NA,Religion,WILEY,NA +journal of religious history,0022-4227,1467-9809,Journal_RH,1,0,0,1,NA,NA,Religion | History,WILEY,2021-04-11 +journal of renal care,1755-6678,1755-6686,JRenCare,0,1,1,1,Nursing | Urology & Nephrology,Nursing,NA,WILEY,2019-09-23 +journal of renal care,1755-6678,1755-6686,JRenCare,0,1,1,1,Nursing | Urology & Nephrology,Nursing,NA,WILEY,2019-09-23 +journal of renal nutrition,1051-2276,1532-8503,JReN_Social,0,0,1,1,Nutrition & Dietetics | Urology & Nephrology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2018-11-04 +journal of renewable and sustainable energy,1941-7012,1941-7012,NA,0,0,1,0,Green & Sustainable Science & Technology | Energy & Fuels,NA,NA,AIP PUBLISHING,NA +journal of renewable materials,2164-6325,2164-6341,NA,0,0,1,0,"Green & Sustainable Science & Technology | Materials Science, Composites | Polymer Science",NA,NA,TECH SCIENCE PRESS,NA +journal of reproduction and development,0916-8818,1348-4400,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Reproductive Biology",NA,NA,SOCIETY REPRODUCTION & DEVELOPMENT-SRD,NA +journal of reproductive and infant psychology,0264-6838,1469-672X,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of reproductive immunology,0165-0378,1872-7603,NA,0,0,1,0,Immunology | Reproductive Biology,NA,NA,ELSEVIER IRELAND LTD,NA +journal of reproductive medicine,0024-7758,1943-3565,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,SCI PRINTERS & PUBL INC,NA +journal of research in crime and delinquency,0022-4278,1552-731X,journalrcd,0,1,0,1,NA,Criminology & Penology,NA,SAGE PUBLICATIONS INC,2017-11-23 +journal of research in interactive marketing,2040-7122,2040-7130,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of research in medical sciences,1735-1995,1735-7136,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +journal of research in music education,0022-4294,1945-0095,NA,1,1,0,0,NA,Education & Educational Research,Music,SAGE PUBLICATIONS INC,NA +journal of research in music education,0022-4294,1945-0095,NA,1,1,0,0,NA,Education & Educational Research,Music,SAGE PUBLICATIONS INC,NA +journal of research in personality,0092-6566,1095-7251,NA,0,1,0,0,NA,"Psychology, Social",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of research in reading,0141-0423,1467-9817,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,WILEY,NA +journal of research in science teaching,0022-4308,1098-2736,JRSTpub,0,1,0,1,NA,Education & Educational Research,NA,WILEY,2020-11-15 +journal of research of the national institute of standards and technology,1044-677X,2165-7254,NA,0,0,1,0,"Instruments & Instrumentation | Physics, Applied",NA,NA,"NATL INST STANDARDS & TECHNOLOGY-NIST",NA +journal of research on adolescence,1050-8392,1532-7795,NA,0,1,0,0,NA,"Family Studies | Psychology, Development",NA,WILEY,NA +journal of research on educational effectiveness,1934-5747,1934-5739,editors_JREE,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-01-03 +journal of research on technology in education,1539-1523,1945-0818,JRTE_Official,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-05-02 +journal of responsible innovation,2329-9460,2329-9037,JResInnov,0,1,0,1,NA,Ethics | History & Philosophy Of Science | Management | Social Issues,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-04-06 +journal of retailing,0022-4359,1873-3271,JR_Updates,0,1,0,1,NA,Business,NA,ELSEVIER SCIENCE INC,2010-08-27 +journal of retailing and consumer services,0969-6989,1873-1384,NA,0,1,0,0,NA,Business,NA,ELSEVIER SCI LTD,NA +journal of rheology,0148-6055,1520-8516,NA,0,0,1,0,Mechanics,NA,NA,SOC RHEOLOGY,NA +journal of rheumatology,0315-162X,1499-2752,jrheum,0,0,1,1,Rheumatology,NA,NA,J RHEUMATOL PUBL CO,2011-01-31 +journal of risk,1465-1211,1755-2842,NA,0,1,0,0,NA,"Business, Finance",NA,INCISIVE MEDIA,NA +journal of risk and insurance,0022-4367,1539-6975,JournalRiskIns,0,1,0,1,NA,"Business, Finance | Economics",NA,WILEY,2019-01-02 +journal of risk and uncertainty,0895-5646,1573-0476,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,SPRINGER,NA +journal of risk model validation,1753-9579,1753-9587,NA,0,1,0,0,NA,"Business, Finance",NA,INCISIVE MEDIA,NA +journal of risk research,1366-9877,1466-4461,JofRiskResearch,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-07-27 +journal of rock mechanics and geotechnical engineering,1674-7755,2589-0417,NA,0,0,1,0,"Engineering, Geological",NA,NA,SCIENCE PRESS,NA +journal of roman archaeology,1047-7594,2331-5709,NA,1,0,0,0,NA,NA,Archaeology,CAMBRIDGE UNIV PRESS,NA +journal of roman studies,0075-4358,1753-528X,NA,1,0,0,0,NA,NA,Classics,CAMBRIDGE UNIV PRESS,NA +journal of rubber research,1511-1768,2524-3993,NA,0,0,1,0,Polymer Science,NA,NA,SPRINGER SINGAPORE PTE LTD,NA +journal of rural health,0890-765X,1748-0361,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,WILEY,NA +journal of rural health,0890-765X,1748-0361,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,WILEY,NA +journal of rural studies,0743-0167,1873-1392,NA,0,1,0,0,NA,Geography | Regional & Urban Planning,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of russian laser research,1071-2836,1573-8760,NA,0,0,1,0,Optics,NA,NA,SPRINGER,NA +journal of safety research,0022-4375,1879-1247,NA,0,1,0,0,NA,"Ergonomics | Public, Environmental & Occupational Health | Social Sciences, Interdisciplinary | Transportation",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of sandwich structures & materials,1099-6362,1530-7972,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Characterization, Testing | Materials Science, Composites",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of saudi chemical society,1319-6103,2212-4640,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,ELSEVIER,NA +journal of scheduling,1094-6136,1099-1425,NA,0,0,1,0,"Engineering, Manufacturing | Operations Research & Management Science",NA,NA,SPRINGER,NA +journal of scholarly publishing,1198-9742,1710-1166,NA,1,1,0,0,NA,Information Science & Library Science,"Humanities, Multidisciplinary",UNIV TORONTO PRESS INC,NA +journal of scholarly publishing,1198-9742,1710-1166,NA,1,1,0,0,NA,Information Science & Library Science,"Humanities, Multidisciplinary",UNIV TORONTO PRESS INC,NA +journal of school health,0022-4391,1746-1561,NA,0,1,1,0,"Education, Scientific Disciplines | Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Education & Educational Research",NA,WILEY,NA +journal of school health,0022-4391,1746-1561,NA,0,1,1,0,"Education, Scientific Disciplines | Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Education & Educational Research",NA,WILEY,NA +journal of school nursing,1059-8405,1546-8364,NA,0,1,1,0,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +journal of school nursing,1059-8405,1546-8364,NA,0,1,1,0,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +journal of school psychology,0022-4405,1873-3506,JofSchoolPsych,0,1,0,1,NA,"Psychology, Educational",NA,PERGAMON-ELSEVIER SCIENCE LTD,2016-02-17 +journal of school violence,1538-8220,1538-8239,NA,0,1,0,0,NA,"Criminology & Penology | Education & Educational Research | Psychology, Educational | Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of science-advanced materials and devices,2468-2284,2468-2179,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,VIETNAM NATL UNIV,NA +journal of science and medicine in sport,1440-2440,1878-1861,_JSAMS,0,0,1,1,Sport Sciences,NA,NA,ELSEVIER SCI LTD,2018-10-24 +journal of science education and technology,1059-0145,1573-1839,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,SPRINGER,NA +journal of science education and technology,1059-0145,1573-1839,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,SPRINGER,NA +journal of scientific & industrial research,0022-4456,0975-1084,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,"NATL INST SCIENCE COMMUNICATION-NISCAIR",NA +journal of scientific computing,0885-7474,1573-7691,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of screenwriting,1759-7137,1759-7145,NA,1,0,0,0,NA,NA,"Literature | Film, Radio, Television",INTELLECT LTD,NA +journal of sea research,1385-1101,1873-1414,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,ELSEVIER,NA +journal of second language writing,1060-3743,1873-1422,NA,0,1,0,0,NA,Linguistics,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of sedimentary research,1527-1404,1938-3681,NA,0,0,1,0,Geology,NA,NA,SEPM-SOC SEDIMENTARY GEOLOGY,NA +journal of seed science,2317-1537,2317-1545,NA,0,0,1,0,Agronomy,NA,NA,ABRATES-ASSOC BRASILEIRA TECHNOLOGIA SEMENTES,NA +journal of seismic exploration,0963-0651,NA,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,GEOPHYSICAL PRESS,NA +journal of seismology,1383-4649,1573-157X,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SPRINGER,NA +journal of semantics,0167-5133,1477-4593,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,OXFORD UNIV PRESS,NA +journal of semantics,0167-5133,1477-4593,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,OXFORD UNIV PRESS,NA +journal of semiconductor technology and science,1598-1657,2233-4866,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied",NA,NA,IEEK PUBLICATION CENTER,NA +journal of semitic studies,0022-4480,1477-8556,NA,1,0,0,0,NA,NA,Asian Studies,OXFORD UNIV PRESS,NA +journal of sensors,1687-725X,1687-7268,NA,0,0,1,0,"Engineering, Electrical & Electronic | Instruments & Instrumentation",NA,NA,HINDAWI LTD,NA +journal of sensory studies,0887-8250,1745-459X,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +journal of separation science,1615-9306,1615-9314,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,WILEY-V C H VERLAG GMBH,NA +journal of service management,1757-5818,1757-5826,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of service research,1094-6705,1552-7379,NA,0,1,0,0,NA,Business,NA,SAGE PUBLICATIONS INC,NA +journal of service theory and practice,2055-6225,2055-6225,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of services marketing,0887-6045,0887-6045,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of sex & marital therapy,0092-623X,1521-0715,NA,0,1,0,0,NA,"Psychology, Clinical | Family Studies",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of sex research,0022-4499,1559-8519,NA,0,1,0,0,NA,"Psychology, Clinical | Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of sexual aggression,1355-2600,1742-6545,JSATandF,0,1,0,1,NA,Criminology & Penology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-02-13 +journal of sexual medicine,1743-6095,1743-6109,jsexmed,0,0,1,1,Urology & Nephrology,NA,NA,ELSEVIER SCI LTD,2014-06-23 +journal of shellfish research,0730-8000,1943-6319,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,"NATL SHELLFISHERIES ASSOC",NA +journal of shia islamic studies,1748-9423,2051-557X,NA,1,0,0,0,NA,NA,Religion,ISLAMIC COLL ADVANCED STUDIES-ICAS,NA +journal of ship production and design,2158-2866,2158-2874,NA,0,0,1,0,"Engineering, Marine",NA,NA,SOC NAVAL ARCHITECTS MARINE ENGINEERS,NA +journal of ship research,0022-4502,1542-0604,NA,0,0,1,0,"Engineering, Marine | Engineering, Civil",NA,NA,SOC NAVAL ARCHITECTS MARINE ENGINEERS,NA +journal of shoulder and elbow surgery,1058-2746,1532-6500,NA,0,0,1,0,Orthopedics | Sport Sciences | Surgery,NA,NA,MOSBY-ELSEVIER,NA +journal of signal processing systems for signal image and video technology,1939-8018,1939-8115,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +journal of simulation,1747-7778,1747-7786,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of sleep research,0962-1105,1365-2869,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,WILEY,NA +journal of small animal practice,0022-4510,1748-5827,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +journal of small business management,0047-2778,1540-627X,NA,0,1,0,0,NA,Management,NA,TAYLOR & FRANCIS INC,NA +journal of social and clinical psychology,0736-7236,1943-2771,NA,0,1,0,0,NA,"Psychology, Clinical | Psychology, Social",NA,GUILFORD PUBLICATIONS INC,NA +journal of social and personal relationships,0265-4075,1460-3608,josoperrel,0,1,0,1,NA,"Communication | Family Studies | Psychology, Social",NA,SAGE PUBLICATIONS LTD,2014-12-30 +journal of social archaeology,1469-6053,1741-2951,NA,1,1,0,0,NA,Anthropology,Archaeology,SAGE PUBLICATIONS LTD,NA +journal of social archaeology,1469-6053,1741-2951,NA,1,1,0,0,NA,Anthropology,Archaeology,SAGE PUBLICATIONS LTD,NA +journal of social history,0022-4529,1527-1897,SocHistBlog,1,1,0,1,NA,History,History,OXFORD UNIV PRESS INC,2015-09-17 +journal of social history,0022-4529,1527-1897,SocHistBlog,1,1,0,1,NA,History,History,OXFORD UNIV PRESS INC,2015-09-17 +journal of social issues,0022-4537,1540-4560,NA,0,1,0,0,NA,"Social Issues | Psychology, Social",NA,WILEY,NA +journal of social marketing,2042-6763,2042-6771,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +journal of social philosophy,0047-2786,1467-9833,NA,1,1,0,0,NA,Ethics | Social Issues,Philosophy,WILEY,NA +journal of social philosophy,0047-2786,1467-9833,NA,1,1,0,0,NA,Ethics | Social Issues,Philosophy,WILEY,NA +journal of social policy,0047-2794,1469-7823,JSP_Journal,0,1,0,1,NA,Public Administration | Social Issues | Social Work,NA,CAMBRIDGE UNIV PRESS,2018-09-12 +journal of social psychology,0022-4545,1940-1183,NA,0,1,0,0,NA,"Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of social service research,0148-8376,1540-7314,NA,0,1,0,0,NA,Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of social work,1468-0173,1741-296X,NA,0,1,0,0,NA,Social Work,NA,SAGE PUBLICATIONS INC,NA +journal of social work education,1043-7797,2163-5811,NA,0,1,0,0,NA,Education & Educational Research | Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of social work practice,0265-0533,1465-3885,JournalSWPrac,0,1,0,1,NA,Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-08-03 +journal of sociolinguistics,1360-6441,1467-9841,NA,0,1,0,0,NA,Linguistics,NA,WILEY,NA +journal of sociology,1440-7833,1741-2978,jsociology,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2013-08-28 +journal of software-evolution and process,2047-7473,2047-7481,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,WILEY,NA +journal of soil and water conservation,0022-4561,1941-3300,NA,0,0,1,0,Ecology | Soil Science | Water Resources,NA,NA,SOIL WATER CONSERVATION SOC,NA +journal of soil science and plant nutrition,0718-9508,0718-9516,Journal_JSSPN,0,0,1,1,Plant Sciences | Environmental Sciences | Soil Science,NA,NA,SPRINGER INT PUBL AG,2017-11-14 +journal of soils and sediments,1439-0108,1614-7480,NA,0,0,1,0,Environmental Sciences | Soil Science,NA,NA,SPRINGER HEIDELBERG,NA +journal of sol-gel science and technology,0928-0707,1573-4846,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,SPRINGER,NA +journal of solar energy engineering-transactions of the asme,0199-6231,1528-8986,NA,0,0,1,0,"Energy & Fuels | Engineering, Mechanical",NA,NA,ASME,NA +journal of solid state chemistry,0022-4596,1095-726X,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Physical",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of solid state electrochemistry,1432-8488,1433-0768,NA,0,0,1,0,Electrochemistry,NA,NA,SPRINGER,NA +journal of solution chemistry,0095-9782,1572-8927,NA,0,0,1,0,"Chemistry, Physical",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of song-yuan studies,1059-3152,2154-6665,NA,1,0,0,0,NA,NA,History | Asian Studies,IEAS PUBLICATION,NA +journal of sound and vibration,0022-460X,1095-8568,NA,0,0,1,0,"Acoustics | Engineering, Mechanical | Mechanics",NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of south american earth sciences,0895-9811,1873-0647,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of south asian development,0973-1741,0973-1733,NA,0,1,0,0,NA,Development Studies,NA,SAGE PUBLICATIONS INDIA PVT LTD,NA +journal of southeast asian studies,0022-4634,1474-0680,NA,1,1,0,0,NA,Area Studies,Asian Studies,CAMBRIDGE UNIV PRESS,NA +journal of southeast asian studies,0022-4634,1474-0680,NA,1,1,0,0,NA,Area Studies,Asian Studies,CAMBRIDGE UNIV PRESS,NA +journal of southern african studies,0305-7070,1465-3893,jsas_editors,0,1,0,1,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-10-14 +journal of southern hemisphere earth systems science,2206-5865,2206-5865,NA,0,0,1,0,Meteorology & Atmospheric Sciences | Oceanography,NA,NA,CSIRO PUBLISHING,NA +journal of southern history,0022-4642,2325-6893,JourSouHist,1,0,0,1,NA,NA,History,SOUTHERN HISTORICAL ASSOC,2012-04-03 +journal of space weather and space climate,2115-7251,2115-7251,NA,0,0,1,0,Astronomy & Astrophysics | Geochemistry & Geophysics | Meteorology & Atmospheric Sciences,NA,NA,EDP SCIENCES S A,NA +journal of spacecraft and rockets,0022-4650,1533-6794,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,AMER INST AERONAUTICS ASTRONAUTICS,NA +journal of spanish cultural studies,1463-6204,1469-9818,journaljscs,1,1,0,1,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-10-26 +journal of spanish cultural studies,1463-6204,1469-9818,journaljscs,1,1,0,1,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-10-26 +journal of spatial science,1449-8596,1836-5655,NA,0,0,1,0,"Geography, Physical | Remote Sensing",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of special education,0022-4669,1538-4764,NA,0,1,0,0,NA,"Education, Special",NA,SAGE PUBLICATIONS INC,NA +journal of special education technology,0162-6434,2381-3121,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SAGE PUBLICATIONS INC,NA +journal of specialised translation,1740-357X,1740-357X,JostransT,1,1,0,1,NA,Linguistics,Language & Linguistics,ROEHAMPTON UNIV SCH ARTS,2021-01-30 +journal of specialised translation,1740-357X,1740-357X,JostransT,1,1,0,1,NA,Linguistics,Language & Linguistics,ROEHAMPTON UNIV SCH ARTS,2021-01-30 +journal of spectral theory,1664-039X,1664-0403,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +journal of spectroscopy,2314-4920,2314-4939,NA,0,0,1,0,Biochemical Research Methods | Spectroscopy,NA,NA,HINDAWI LTD,NA +journal of speculative philosophy,0891-625X,1527-9383,NA,1,0,0,0,NA,NA,Philosophy,PENN STATE UNIV PRESS,NA +journal of speech language and hearing research,1092-4388,1558-9102,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,AMER SPEECH-LANGUAGE-HEARING ASSOC,NA +journal of speech language and hearing research,1092-4388,1558-9102,NA,0,1,1,0,Audiology & Speech-Language Pathology | Rehabilitation,Rehabilitation | Linguistics,NA,AMER SPEECH-LANGUAGE-HEARING ASSOC,NA +journal of spinal cord medicine,1079-0268,2045-7723,JSpinalCordMed,0,0,1,1,Clinical Neurology,NA,NA,TAYLOR & FRANCIS LTD,2014-05-01 +journal of sport & exercise psychology,0895-2779,1543-2904,NA,0,1,1,0,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,HUMAN KINETICS PUBL INC,NA +journal of sport & exercise psychology,0895-2779,1543-2904,NA,0,1,1,0,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,HUMAN KINETICS PUBL INC,NA +journal of sport & social issues,0193-7235,1552-7638,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,SAGE PUBLICATIONS INC,NA +journal of sport and health science,2095-2546,2213-2961,JSHS_MedHealth,0,1,1,1,Sport Sciences,"Hospitality, Leisure, Sport & Tourism",NA,SHANGHAI UNIV SPORT,2017-04-06 +journal of sport and health science,2095-2546,2213-2961,JSHS_MedHealth,0,1,1,1,Sport Sciences,"Hospitality, Leisure, Sport & Tourism",NA,SHANGHAI UNIV SPORT,2017-04-06 +journal of sport management,0888-4773,1543-270X,JSMjournal,0,1,1,1,Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Management",NA,HUMAN KINETICS PUBL INC,2015-07-09 +journal of sport management,0888-4773,1543-270X,JSMjournal,0,1,1,1,Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Management",NA,HUMAN KINETICS PUBL INC,2015-07-09 +journal of sport rehabilitation,1056-6716,1543-3072,JSportRehab,0,0,1,1,Rehabilitation | Sport Sciences,NA,NA,HUMAN KINETICS PUBL INC,2017-06-27 +journal of sports economics,1527-0025,1552-7794,NA,0,1,0,0,NA,"Economics | Hospitality, Leisure, Sport & Tourism",NA,SAGE PUBLICATIONS INC,NA +journal of sports medicine and physical fitness,0022-4707,1827-1928,NA,0,0,1,0,Sport Sciences,NA,NA,EDIZIONI MINERVA MEDICA,NA +journal of sports science and medicine,1303-2968,1303-2968,j_s_s_m,0,0,1,1,Sport Sciences,NA,NA,JOURNAL SPORTS SCIENCE & MEDICINE,2013-05-29 +journal of sports sciences,0264-0414,1466-447X,JSportsSci,0,0,1,1,Sport Sciences,NA,NA,TAYLOR & FRANCIS LTD,2013-07-05 +journal of statistical computation and simulation,0094-9655,1563-5163,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Statistics & Probability",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of statistical mechanics-theory and experiment,1742-5468,1742-5468,NA,0,0,1,0,"Mechanics | Physics, Mathematical",NA,NA,IOP PUBLISHING LTD,NA +journal of statistical physics,0022-4715,1572-9613,NA,0,0,1,0,"Physics, Mathematical",NA,NA,SPRINGER,NA +journal of statistical planning and inference,0378-3758,1873-1171,NA,0,0,1,0,Statistics & Probability,NA,NA,ELSEVIER,NA +journal of statistical software,1548-7660,1548-7660,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Statistics & Probability",NA,NA,JOURNAL STATISTICAL SOFTWARE,NA +journal of steroid biochemistry and molecular biology,0960-0760,1879-1220,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of stomatology oral and maxillofacial surgery,2468-8509,2468-7855,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER,NA +journal of stored products research,0022-474X,1879-1212,NA,0,0,1,0,Entomology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of strain analysis for engineering design,0309-3247,2041-3130,NA,0,0,1,0,"Engineering, Mechanical | Mechanics | Materials Science, Characterization, Testing",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of strategic information systems,0963-8687,1873-1198,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,ELSEVIER,NA +journal of strategic information systems,0963-8687,1873-1198,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,ELSEVIER,NA +journal of strategic studies,0140-2390,1743-937X,jststs,0,1,0,1,NA,International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-10-14 +journal of strength and conditioning research,1064-8011,1533-4287,JSCRonline,0,0,1,1,Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-07-28 +journal of stroke,2287-6391,2287-6405,NA,0,0,1,0,Clinical Neurology | Peripheral Vascular Diseases,NA,NA,KOREAN STROKE SOC,NA +journal of stroke & cerebrovascular diseases,1052-3057,1532-8511,JSCVD2,0,0,1,1,Neurosciences | Peripheral Vascular Diseases,NA,NA,ELSEVIER,2019-04-25 +journal of structural biology,1047-8477,1095-8657,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics | Cell Biology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of structural chemistry,0022-4766,1573-8779,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Physical",NA,NA,PLEIADES PUBLISHING INC,NA +journal of structural engineering,0733-9445,1943-541X,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of structural geology,0191-8141,1873-1201,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of studies in international education,1028-3153,1552-7808,jsinted,0,1,0,1,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,2015-09-18 +journal of studies on alcohol and drugs,1937-1888,1938-4114,JSADJournal,0,1,1,1,Substance Abuse | Psychology,Substance Abuse,NA,ALCOHOL RES DOCUMENTATION INC CENT ALCOHOL STUD RUTGERS UNIV,2009-08-18 +journal of studies on alcohol and drugs,1937-1888,1938-4114,JSADJournal,0,1,1,1,Substance Abuse | Psychology,Substance Abuse,NA,ALCOHOL RES DOCUMENTATION INC CENT ALCOHOL STUD RUTGERS UNIV,2009-08-18 +journal of substance abuse treatment,0740-5472,1873-6483,JSATjournal,0,1,0,1,NA,"Psychology, Clinical | Substance Abuse",NA,PERGAMON-ELSEVIER SCIENCE LTD,2018-11-27 +journal of substance use,1465-9891,1475-9942,NA,0,1,0,0,NA,Substance Abuse,NA,TAYLOR & FRANCIS INC,NA +journal of sulfur chemistry,1741-5993,1741-6000,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of supercomputing,0920-8542,1573-0484,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods | Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +journal of superconductivity and novel magnetism,1557-1939,1557-1947,NA,0,0,1,0,"Physics, Applied | Physics, Condensed Matter",NA,NA,SPRINGER,NA +journal of supercritical fluids,0896-8446,1872-8162,NA,0,0,1,0,"Chemistry, Physical | Engineering, Chemical",NA,NA,ELSEVIER,NA +journal of superhard materials,1063-4576,1934-9408,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,PLEIADES PUBLISHING INC,NA +journal of supply chain management,1523-2409,1745-493X,NA,0,1,0,0,NA,Management,NA,WILEY,NA +journal of surfactants and detergents,1097-3958,1558-9293,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Engineering, Chemical",NA,NA,WILEY,NA +journal of surgical education,1931-7204,1878-7452,JSurgEduc,0,0,1,1,"Education, Scientific Disciplines | Surgery",NA,NA,ELSEVIER SCIENCE INC,2016-04-17 +journal of surgical oncology,0022-4790,1096-9098,NA,0,0,1,0,Oncology | Surgery,NA,NA,WILEY,NA +journal of surgical research,0022-4804,1095-8673,JSurgRes,0,0,1,1,Surgery,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2015-06-24 +journal of survey statistics and methodology,2325-0984,2325-0992,JSurvStatMeth,0,1,1,1,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,OXFORD UNIV PRESS INC,2020-09-01 +journal of survey statistics and methodology,2325-0984,2325-0992,JSurvStatMeth,0,1,1,1,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,OXFORD UNIV PRESS INC,2020-09-01 +journal of surveying engineering,0733-9453,1943-5428,NA,0,0,1,0,"Engineering, Civil",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of sustainable cement-based materials,2165-0373,2165-0381,NA,0,0,1,0,"Construction & Building Technology | Green & Sustainable Science & Technology | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of sustainable forestry,1054-9811,1540-756X,JSustForestry,0,0,1,1,Forestry,NA,NA,TAYLOR & FRANCIS INC,2018-12-18 +journal of sustainable metallurgy,2199-3823,2199-3831,NA,0,0,1,0,Green & Sustainable Science & Technology | Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER,NA +journal of sustainable tourism,0966-9582,1747-7646,JSustTour,0,1,0,1,NA,"Green & Sustainable Science & Technology | Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-07-17 +journal of swine health and production,1537-209X,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,AMER ASSOC SWINE VETERINARIANS,NA +journal of symbolic computation,0747-7171,1095-855X,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of symbolic logic,0022-4812,1943-5886,NA,0,0,1,0,Mathematics | Logic,NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of symplectic geometry,1527-5256,1540-2347,NA,0,0,1,0,Mathematics,NA,NA,"INT PRESS BOSTON, INC",NA +journal of synchrotron radiation,0909-0495,1600-5775,JSynchrotronRad,0,0,1,1,"Instruments & Instrumentation | Optics | Physics, Applied",NA,NA,INT UNION CRYSTALLOGRAPHY,2012-05-22 +journal of synthetic organic chemistry japan,0037-9980,1883-6526,NA,0,0,1,0,"Chemistry, Organic",NA,NA,SOC SYNTHETIC ORGANIC CHEM JPN,NA +journal of systematic palaeontology,1477-2019,1478-0941,JournalSystPal,0,0,1,1,Evolutionary Biology | Paleontology,NA,NA,TAYLOR & FRANCIS LTD,2014-02-14 +journal of systematics and evolution,1674-4918,1759-6831,NA,0,0,1,0,Plant Sciences,NA,NA,WILEY,NA +journal of systems and software,0164-1212,1873-1228,JSSoftware,0,0,1,1,"Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,ELSEVIER SCIENCE INC,2017-03-01 +journal of systems architecture,1383-7621,1873-6165,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Software Engineering",NA,NA,ELSEVIER,NA +journal of systems engineering and electronics,1004-4132,1004-4132,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic | Operations Research & Management Science",NA,NA,"SYSTEMS ENGINEERING & ELECTRONICS, EDITORIAL DEPT",NA +journal of systems science & complexity,1009-6124,1559-7067,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER HEIDELBERG,NA +journal of systems science and systems engineering,1004-3756,1861-9576,NA,0,0,1,0,Operations Research & Management Science,NA,NA,SPRINGER HEIDELBERG,NA +journal of taibah university for science,1658-3655,1658-3655,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of teacher education,0022-4871,1552-7816,JTEInsider,0,1,0,1,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,2015-12-03 +journal of teaching in physical education,0273-5024,1543-2769,JTPEjournal,0,1,1,1,Sport Sciences,Education & Educational Research,NA,HUMAN KINETICS PUBL INC,2021-02-11 +journal of teaching in physical education,0273-5024,1543-2769,JTPEjournal,0,1,1,1,Sport Sciences,Education & Educational Research,NA,HUMAN KINETICS PUBL INC,2021-02-11 +journal of technology transfer,0892-9912,1573-7047,NA,0,1,0,0,NA,Management,NA,SPRINGER,NA +journal of telemedicine and telecare,1357-633X,1758-1109,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,SAGE PUBLICATIONS LTD,NA +journal of terramechanics,0022-4898,1879-1204,NA,0,0,1,0,"Engineering, Environmental",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of testing and evaluation,0090-3973,1945-7553,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,AMER SOC TESTING MATERIALS,NA +journal of texture studies,0022-4901,1745-4603,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +journal of the academy of consultation-liaison psychiatry,2667-2960,2667-2960,NA,0,1,1,0,Psychology | Psychiatry,Psychiatry,NA,ELSEVIER SCIENCE INC,NA +journal of the academy of consultation-liaison psychiatry,2667-2960,2667-2960,NA,0,1,1,0,Psychology | Psychiatry,Psychiatry,NA,ELSEVIER SCIENCE INC,NA +journal of the academy of marketing science,0092-0703,1552-7824,JAMS_updates,0,1,0,1,NA,Business,NA,SPRINGER,2009-05-17 +journal of the academy of nutrition and dietetics,2212-2672,2212-2680,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,ELSEVIER SCIENCE INC,NA +journal of the acm,0004-5411,1557-735X,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,ASSOC COMPUTING MACHINERY,NA +journal of the acoustical society of america,0001-4966,1520-8524,NA,0,0,1,0,Acoustics | Audiology & Speech-Language Pathology,NA,NA,ACOUSTICAL SOC AMER AMER INST PHYSICS,NA +journal of the air & waste management association,1096-2247,2162-2906,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences | Meteorology & Atmospheric Sciences",NA,NA,TAYLOR & FRANCIS INC,NA +journal of the american academy of audiology,1050-0545,2157-3107,NA,0,0,1,0,Audiology & Speech-Language Pathology | Otorhinolaryngology,NA,NA,THIEME MEDICAL PUBL INC,NA +journal of the american academy of child and adolescent psychiatry,0890-8567,1527-5418,JAACAP,0,1,1,1,Pediatrics | Psychiatry,"Psychiatry | Psychology, Development",NA,ELSEVIER SCIENCE INC,2012-09-28 +journal of the american academy of child and adolescent psychiatry,0890-8567,1527-5418,JAACAP,0,1,1,1,Pediatrics | Psychiatry,"Psychiatry | Psychology, Development",NA,ELSEVIER SCIENCE INC,2012-09-28 +journal of the american academy of dermatology,0190-9622,1097-6787,NA,0,0,1,0,Dermatology,NA,NA,MOSBY-ELSEVIER,NA +journal of the american academy of orthopaedic surgeons,1067-151X,1940-5480,OfficialJAAOS,0,0,1,1,Orthopedics | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-05-17 +journal of the american academy of psychiatry and the law,1093-6793,1943-3662,NA,0,1,0,0,NA,Law | Psychiatry,NA,AMER ACAD PSYCHIATRY & LAW,NA +journal of the american academy of religion,0002-7189,1477-4585,NA,1,0,0,0,NA,NA,Religion,OXFORD UNIV PRESS INC,NA +journal of the american animal hospital association,0587-2871,1547-3317,NA,0,0,1,0,Veterinary Sciences,NA,NA,AMER ANIMAL HOSPITAL ASSOC,NA +journal of the american association for laboratory animal science,1559-6109,1559-6109,NA,0,0,1,0,Veterinary Sciences | Zoology,NA,NA,AMER ASSOC LABORATORY ANIMAL SCIENCE,NA +journal of the american association of nurse practitioners,2327-6886,2327-6924,NA,0,1,1,0,Health Care Sciences & Services | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of the american association of nurse practitioners,2327-6886,2327-6924,NA,0,1,1,0,Health Care Sciences & Services | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of the american board of family medicine,1557-2625,1558-7118,JAmBoardFamMed,0,0,1,1,"Primary Health Care | Medicine, General & Internal",NA,NA,AMER BOARD FAMILY MEDICINE,2019-10-02 +journal of the american ceramic society,0002-7820,1551-2916,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,WILEY,NA +journal of the american chemical society,0002-7863,1520-5126,J_A_C_S,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2008-12-02 +journal of the american college of cardiology,0735-1097,1558-3597,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCIENCE INC,NA +journal of the american college of nutrition,0731-5724,1541-1087,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of the american college of radiology,1546-1440,1558-349X,JACRJournal,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,2014-04-15 +journal of the american college of surgeons,1072-7515,1879-1190,acsJACS,0,0,1,1,Surgery,NA,NA,ELSEVIER SCIENCE INC,2013-04-24 +journal of the american dental association,0002-8177,1943-4723,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,AMER DENTAL ASSOC,NA +journal of the american geriatrics society,0002-8614,1532-5415,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,WILEY,NA +journal of the american geriatrics society,0002-8614,1532-5415,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,WILEY,NA +journal of the american heart association,2047-9980,2047-9980,JAHA_AHA,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,WILEY,2012-09-26 +journal of the american helicopter society,0002-8711,2161-6027,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,AMER HELICOPTER SOC INC,NA +journal of the american institute for conservation,0197-1360,1945-2330,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of the american leather chemists association,0002-9726,NA,NA,0,0,1,0,"Chemistry, Applied | Materials Science, Textiles",NA,NA,AMER LEATHER CHEMISTS ASSOC,NA +journal of the american mathematical society,0894-0347,1088-6834,NA,0,0,1,0,Mathematics,NA,NA,AMER MATHEMATICAL SOC,NA +journal of the american medical directors association,1525-8610,1538-9375,JAMDAcom,0,0,1,1,Geriatrics & Gerontology,NA,NA,ELSEVIER SCIENCE INC,2012-11-12 +journal of the american medical informatics association,1067-5027,1527-974X,JAMIAEditor_Sue,0,1,1,1,"Computer Science, Information Systems | Computer Science, Interdisciplinary Applications | Health Care Sciences & Services | Medical Informatics",Information Science & Library Science,NA,OXFORD UNIV PRESS,2018-05-21 +journal of the american medical informatics association,1067-5027,1527-974X,JAMIAEditor_Sue,0,1,1,1,"Computer Science, Information Systems | Computer Science, Interdisciplinary Applications | Health Care Sciences & Services | Medical Informatics",Information Science & Library Science,NA,OXFORD UNIV PRESS,2018-05-21 +journal of the american mosquito control association,8756-971X,1943-6270,NA,0,0,1,0,Entomology,NA,NA,AMER MOSQUITO CONTROL ASSOC,NA +journal of the american musicological society,0003-0139,1547-3848,NA,1,0,0,0,NA,NA,Music,UNIV CALIFORNIA PRESS,NA +journal of the american oil chemists society,0003-021X,1558-9331,NA,0,0,1,0,"Chemistry, Applied | Food Science & Technology",NA,NA,WILEY,NA +journal of the american oriental society,0003-0279,2169-2289,NA,1,0,0,0,NA,NA,Asian Studies,AMER ORIENTAL SOC,NA +journal of the american pharmacists association,1544-3191,1544-3450,JAPhAJournal,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ELSEVIER,2018-08-27 +journal of the american philosophical association,2053-4477,2053-4485,NA,1,0,0,0,NA,NA,Philosophy,CAMBRIDGE UNIV PRESS,NA +journal of the american planning association,0194-4363,1939-0130,NA,0,1,0,0,NA,Regional & Urban Planning | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of the american podiatric medical association,8750-7315,1930-8264,NA,0,0,1,0,Orthopedics,NA,NA,AMER PODIATRIC MED ASSOC,NA +journal of the american pomological society,1527-3741,1527-3741,NA,0,0,1,0,Agronomy | Horticulture,NA,NA,AMER POMOLOGICAL SOC,NA +journal of the american psychiatric nurses association,1078-3903,1532-5725,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,SAGE PUBLICATIONS INC,NA +journal of the american psychiatric nurses association,1078-3903,1532-5725,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,SAGE PUBLICATIONS INC,NA +journal of the american psychoanalytic association,0003-0651,1941-2460,NA,0,1,0,0,NA,"Psychiatry | Psychology, Psychoanalysis",NA,SAGE PUBLICATIONS INC,NA +journal of the american society for horticultural science,0003-1062,2327-9788,NA,0,0,1,0,Horticulture,NA,NA,AMER SOC HORTICULTURAL SCIENCE,NA +journal of the american society for mass spectrometry,1044-0305,1879-1123,J_ASMS,0,0,1,1,"Chemistry, Analytical | Chemistry, Physical | Spectroscopy | Biochemical Research Methods",NA,NA,AMER CHEMICAL SOC,2020-10-08 +journal of the american society of agronomy,0095-9650,NA,NA,0,0,1,0,Agronomy,NA,NA,AMER SOC AGRONOMY,NA +journal of the american society of brewing chemists,0361-0470,1943-7854,NA,0,0,1,0,Biotechnology & Applied Microbiology | Food Science & Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of the american society of echocardiography,0894-7317,1097-6795,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,MOSBY-ELSEVIER,NA +journal of the american society of nephrology,1046-6673,1533-3450,JASN_News,0,0,1,1,Urology & Nephrology,NA,NA,AMER SOC NEPHROLOGY,2015-01-21 +journal of the american statistical association,0162-1459,1537-274X,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +journal of the american water resources association,1093-474X,1752-1688,NA,0,0,1,0,"Engineering, Environmental | Geosciences, Multidisciplinary | Water Resources",NA,NA,WILEY,NA +journal of the anatomical society of india,0003-2778,2352-3050,NA,0,0,1,0,Anatomy & Morphology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +journal of the asia pacific economy,1354-7860,1469-9648,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of the association for information science and technology,2330-1635,2330-1643,JASIST,0,1,1,1,"Computer Science, Information Systems",Information Science & Library Science,NA,WILEY,2012-05-24 +journal of the association for information science and technology,2330-1635,2330-1643,JASIST,0,1,1,1,"Computer Science, Information Systems",Information Science & Library Science,NA,WILEY,2012-05-24 +journal of the association for information systems,1536-9323,1558-3457,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,ASSOC INFORMATION SYSTEMS,NA +journal of the association for information systems,1536-9323,1558-3457,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,ASSOC INFORMATION SYSTEMS,NA +journal of the association of environmental and resource economists,2333-5955,2333-5963,JaereAere,0,1,0,1,NA,Economics | Environmental Studies,NA,UNIV CHICAGO PRESS,2020-05-28 +journal of the astronautical sciences,0021-9142,2195-0571,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,SPRINGER HEIDELBERG,NA +journal of the atmospheric sciences,0022-4928,1520-0469,AMS_atmos,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,AMER METEOROLOGICAL SOC,2020-10-02 +journal of the audio engineering society,1549-4950,1549-4950,NA,0,0,1,0,"Acoustics | Engineering, Multidisciplinary",NA,NA,AUDIO ENGINEERING SOC,NA +journal of the australian ceramic society,2510-1560,2510-1579,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,SPRINGER,NA +journal of the australian library and information association,2475-0158,2475-0166,JALIAjournal,0,1,0,1,NA,Information Science & Library Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-03-06 +journal of the australian mathematical society,1446-7887,1446-8107,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of the belgian society of radiology,2514-8281,2514-8281,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,UBIQUITY PRESS LTD,NA +journal of the brazilian chemical society,0103-5053,1678-4790,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SOC BRASILEIRA QUIMICA,NA +journal of the brazilian society of mechanical sciences and engineering,1678-5878,1806-3691,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,SPRINGER HEIDELBERG,NA +journal of the british archaeological association,0068-1288,1747-6704,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies | Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of the british society for phenomenology,0007-1773,2332-0486,NA,1,0,0,0,NA,NA,Philosophy,JACKSON PUBLISHING & DISTRIBUTION,NA +journal of the canadian dental association,1488-2159,0709-8936,JCDATweets,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,CANADIAN DENTAL ASSOC,2010-06-14 +journal of the ceramic society of japan,1882-0743,1348-6535,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,CERAMIC SOC JAPAN-NIPPON SERAMIKKUSU KYOKAI,NA +journal of the chemical society of pakistan,0253-5106,0253-5106,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CHEM SOC PAKISTAN,NA +journal of the chilean chemical society,0717-9707,0717-9707,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SOC CHILENA QUIMICA,NA +journal of the chinese chemical society,0009-4536,2192-6549,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +journal of the chinese institute of engineers,0253-3839,2158-7299,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of the chinese medical association,1726-4901,1728-7731,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of the chinese society of mechanical engineers,0257-9731,NA,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,CHINESE SOC MECHANICAL ENGINEERS,NA +journal of the civil war era,2154-4727,2159-9807,NA,0,1,0,0,NA,History,NA,UNIV NORTH CAROLINA PRESS,NA +journal of the copyright society of the usa,0886-3520,NA,NA,0,1,0,0,NA,Law,NA,COPYRIGHT SOC USA,NA +journal of the early republic,0275-1275,1553-0620,TheJERPano,1,0,0,1,NA,NA,History,UNIV PENNSYLVANIA PRESS,2017-01-20 +journal of the economic and social history of the orient,0022-4995,1568-5209,NA,1,1,0,0,NA,History,History,BRILL,NA +journal of the economic and social history of the orient,0022-4995,1568-5209,NA,1,1,0,0,NA,History,History,BRILL,NA +journal of the economics of ageing,2212-828X,2212-8298,NA,0,1,0,0,NA,Demography | Economics | Gerontology,NA,ELSEVIER,NA +journal of the electrochemical society,0013-4651,1945-7111,NA,0,0,1,0,"Electrochemistry | Materials Science, Coatings & Films",NA,NA,ELECTROCHEMICAL SOC INC,NA +journal of the energy institute,1743-9671,1746-0220,NA,0,0,1,0,Energy & Fuels,NA,NA,ELSEVIER SCI LTD,NA +journal of the entomological research society,1302-0250,NA,NA,0,0,1,0,Entomology,NA,NA,GAZI ENTOMOLOGICAL RESEARCH SOC,NA +journal of the european academy of dermatology and venereology,0926-9959,1468-3083,TheJEADV,0,0,1,1,Dermatology,NA,NA,WILEY,2019-09-26 +journal of the european ceramic society,0955-2219,1873-619X,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,ELSEVIER SCI LTD,NA +journal of the european economic association,1542-4766,1542-4774,JEEA_News,0,1,0,1,NA,Economics,NA,OXFORD UNIV PRESS,2018-10-12 +journal of the european mathematical society,1435-9855,1435-9863,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +journal of the european optical society-rapid publications,1990-2573,1990-2573,NA,0,0,1,0,Optics,NA,NA,SPRINGER,NA +journal of the experimental analysis of behavior,0022-5002,1938-3711,NA,0,1,1,0,Behavioral Sciences,"Psychology, Biological | Psychology, Experimental",NA,WILEY,NA +journal of the experimental analysis of behavior,0022-5002,1938-3711,NA,0,1,1,0,Behavioral Sciences,"Psychology, Biological | Psychology, Experimental",NA,WILEY,NA +journal of the faculty of agriculture kyushu university,0023-6152,NA,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,"KYUSHU UNIV, FACULTY AGRICULTURAL PUBLICATIONS",NA +journal of the faculty of engineering and architecture of gazi university,1300-1884,1304-4915,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,"GAZI UNIV, FAC ENGINEERING ARCHITECTURE",NA +journal of the formosan medical association,0929-6646,1876-0821,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ELSEVIER TAIWAN,NA +journal of the franklin institute-engineering and applied mathematics,0016-0032,1879-2693,NA,0,0,1,0,"Automation & Control Systems | Engineering, Multidisciplinary | Engineering, Electrical & Electronic | Mathematics, Interdisciplinary Applications",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of the geological society,0016-7649,2041-479X,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,GEOLOGICAL SOC PUBL HOUSE,NA +journal of the geological society of india,0016-7622,0974-6889,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SPRINGER INDIA,NA +journal of the gilded age and progressive era,1537-7814,1943-3557,journalgape,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2015-04-23 +journal of the gilded age and progressive era,1537-7814,1943-3557,journalgape,1,1,0,1,NA,History,History,CAMBRIDGE UNIV PRESS,2015-04-23 +journal of the hellenic veterinary medical society,1792-2720,1792-2720,NA,0,0,1,0,Veterinary Sciences,NA,NA,HELLENIC VETERINARY MEDICAL SOC,NA +journal of the history of biology,0022-5010,1573-0387,JHistoryBiology,1,1,1,1,History & Philosophy Of Science | Biology,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER,2017-09-06 +journal of the history of biology,0022-5010,1573-0387,JHistoryBiology,1,1,1,1,History & Philosophy Of Science | Biology,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER,2017-09-06 +journal of the history of biology,0022-5010,1573-0387,JHistoryBiology,1,1,1,1,History & Philosophy Of Science | Biology,History & Philosophy Of Science,History & Philosophy Of Science,SPRINGER,2017-09-06 +journal of the history of collections,0954-6650,1477-8564,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",OXFORD UNIV PRESS,NA +journal of the history of economic thought,1053-8372,1469-9656,jhet_journal,1,1,0,1,NA,History | History Of Social Sciences,History,CAMBRIDGE UNIV PRESS,2019-01-07 +journal of the history of economic thought,1053-8372,1469-9656,jhet_journal,1,1,0,1,NA,History | History Of Social Sciences,History,CAMBRIDGE UNIV PRESS,2019-01-07 +journal of the history of ideas,0022-5037,1086-3222,NA,1,0,0,0,NA,NA,Philosophy,UNIV PENNSYLVANIA PRESS,NA +journal of the history of medicine and allied sciences,0022-5045,1468-4373,NA,1,1,1,0,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,OXFORD UNIV PRESS INC,NA +journal of the history of medicine and allied sciences,0022-5045,1468-4373,NA,1,1,1,0,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,OXFORD UNIV PRESS INC,NA +journal of the history of medicine and allied sciences,0022-5045,1468-4373,NA,1,1,1,0,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,OXFORD UNIV PRESS INC,NA +journal of the history of philosophy,0022-5053,1538-4586,JHistPhil,1,0,0,1,NA,NA,Philosophy,JOHNS HOPKINS UNIV PRESS,2020-10-30 +journal of the history of sexuality,1043-4070,1535-3605,JHistSex,1,1,0,1,NA,History | Sociology,History,UNIV TEXAS PRESS,2021-08-05 +journal of the history of sexuality,1043-4070,1535-3605,JHistSex,1,1,0,1,NA,History | Sociology,History,UNIV TEXAS PRESS,2021-08-05 +journal of the history of the behavioral sciences,0022-5061,1520-6696,NA,0,1,0,0,NA,History Of Social Sciences,NA,WILEY,NA +journal of the history of the neurosciences,0964-704X,1744-5213,ISHNISHN1,0,0,1,1,History & Philosophy Of Science | Neurosciences,NA,NA,TAYLOR & FRANCIS INC,2021-11-03 +journal of the indian chemical society,0019-4522,NA,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SCIENTIFIC PUBL-INDIA,NA +journal of the indian institute of science,0970-4140,0019-4964,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,SPRINGER,NA +journal of the indian society of remote sensing,0255-660X,0974-3006,NA,0,0,1,0,Environmental Sciences | Remote Sensing,NA,NA,SPRINGER,NA +journal of the institute of brewing,0046-9750,2050-0416,NA,0,0,1,0,Food Science & Technology,NA,NA,INST BREWING,NA +journal of the institute of mathematics of jussieu,1474-7480,1475-3030,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of the international aids society,1758-2652,1758-2652,jiasociety,0,0,1,1,Immunology | Infectious Diseases,NA,NA,JOHN WILEY & SONS LTD,2012-11-22 +journal of the international neuropsychological society,1355-6177,1469-7661,NA,0,0,1,0,Clinical Neurology | Neurosciences | Psychiatry | Psychology,NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of the international phonetic association,0025-1003,1475-3502,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +journal of the international phonetic association,0025-1003,1475-3502,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +journal of the international society of sports nutrition,1550-2783,1550-2783,NA,0,0,1,0,Nutrition & Dietetics | Sport Sciences,NA,NA,BMC,NA +journal of the iranian chemical society,1735-207X,1735-2428,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER,NA +journal of the japan institute of metals and materials,0021-4876,1880-6880,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,JAPAN INST METALS & MATERIALS,NA +journal of the japan petroleum institute,1346-8804,1349-273X,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum",NA,NA,JAPAN PETROLEUM INST,NA +journal of the japanese and international economies,0889-1583,1095-8681,NA,0,1,0,0,NA,Economics | International Relations,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of the japanese society for food science and technology-nippon shokuhin kagaku kogaku kaishi,1341-027X,1881-6681,NA,0,0,1,0,Food Science & Technology,NA,NA,JAPAN SOC FOOD SCIENCE TECHNOLOGY,NA +journal of the kansas entomological society,0022-8567,1937-2353,NA,0,0,1,0,Entomology,NA,NA,KANSAS ENTOMOLOGICAL SOC,NA +journal of the knowledge economy,1868-7865,1868-7873,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +journal of the korean astronomical society,1225-4614,1225-4614,AstroJKAS,0,0,1,1,Astronomy & Astrophysics,NA,NA,KOREAN ASTRONOMICAL SOCIETY,2017-10-12 +journal of the korean ceramic society,1229-7801,2234-0491,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,SPRINGER HEIDELBERG,NA +journal of the korean mathematical society,0304-9914,2234-3008,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,KOREAN MATHEMATICAL SOC,NA +journal of the korean physical society,0374-4884,1976-8524,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,KOREAN PHYSICAL SOC,NA +journal of the korean statistical society,1226-3192,2005-2863,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER HEIDELBERG,NA +journal of the learning sciences,1050-8406,1532-7809,JLearnSciences,0,1,0,1,NA,"Education & Educational Research | Psychology, Educational",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-09-23 +journal of the lepidopterists society,0024-0966,NA,NA,0,0,1,0,Entomology,NA,NA,LEPIDOPTERISTS SOC,NA +journal of the london mathematical society-second series,0024-6107,1469-7750,NA,0,0,1,0,Mathematics,NA,NA,WILEY,NA +journal of the marine biological association of the united kingdom,0025-3154,1469-7769,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of the mathematical society of japan,0025-5645,NA,NA,0,0,1,0,Mathematics,NA,NA,MATH SOC JAPAN,NA +journal of the mechanical behavior of biomedical materials,1751-6161,1878-0180,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,ELSEVIER,NA +journal of the mechanics and physics of solids,0022-5096,1873-4782,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics | Physics, Condensed Matter",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of the medical library association,1536-5050,1558-9439,JrnlMedLibAssn,0,1,0,1,NA,Information Science & Library Science,NA,MEDICAL LIBRARY ASSOC,2014-01-07 +journal of the meteorological society of japan,0026-1165,2186-9057,JMSJ_metsoc,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,METEOROLOGICAL SOC JAPAN,2015-01-30 +journal of the mexican chemical society,1870-249X,1665-9686,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SOC QUIMICA MEXICO,NA +journal of the midwest modern language association,0742-5562,2162-6294,NA,1,0,0,0,NA,NA,Literature,MIDWEST MODERN LANGUAGE ASSOC,NA +journal of the musical arts in africa,1812-1004,2070-626X,NA,1,0,0,0,NA,NA,Music,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of the national comprehensive cancer network,1540-1405,1540-1413,JNCCN,0,0,1,1,Oncology,NA,NA,HARBORSIDE PRESS,2011-05-03 +journal of the national medical association,0027-9684,1943-4693,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,"NATL MED ASSOC",NA +journal of the national science foundation of sri lanka,1391-4588,2362-0161,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,"NATL SCIENCE FOUNDATION SRI LANKA",NA +journal of the neurological sciences,0022-510X,1878-5883,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,ELSEVIER,NA +journal of the operational research society,0160-5682,1476-9360,NA,0,1,1,0,Operations Research & Management Science,Management,NA,TAYLOR & FRANCIS LTD,NA +journal of the operational research society,0160-5682,1476-9360,NA,0,1,1,0,Operations Research & Management Science,Management,NA,TAYLOR & FRANCIS LTD,NA +journal of the optical society of america a-optics image science and vision,1084-7529,1520-8532,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC AMER,NA +journal of the optical society of america b-optical physics,0740-3224,1520-8540,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC AMER,NA +journal of the pakistan medical association,0030-9982,0030-9982,NA,0,0,1,0,"Medicine, General & Internal | Medicine, Research & Experimental",NA,NA,PAKISTAN MEDICAL ASSOC,NA +journal of the palaeontological society of india,0552-9360,NA,NA,0,0,1,0,Paleontology,NA,NA,PALAEONTOLOGICAL SOC INDIA,NA +journal of the pediatric infectious diseases society,2048-7193,2048-7207,NA,0,0,1,0,Infectious Diseases | Pediatrics,NA,NA,OXFORD UNIV PRESS,NA +journal of the peripheral nervous system,1085-9489,1529-8027,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,WILEY,NA +journal of the philosophy of history,1872-261X,1872-2636,J_Phil_Hist,1,0,0,1,NA,NA,History | Philosophy,BRILL,2018-05-04 +journal of the philosophy of sport,0094-8705,1543-2939,NA,0,1,0,0,NA,"Ethics | Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of the physical society of japan,0031-9015,1347-4073,JPSJ_official,0,0,1,1,"Physics, Multidisciplinary",NA,NA,PHYSICAL SOC JAPAN,2021-11-16 +journal of the polynesian society,0032-4000,2230-5955,NA,0,1,0,0,NA,Anthropology,NA,POLYNESIAN SOC INC,NA +journal of the professional association for cactus development,1938-663X,1938-6648,NA,0,0,1,0,Horticulture,NA,NA,PROFESSIONAL ASSOC CACTUS DEVELOPMENT,NA +journal of the ramanujan mathematical society,0970-1249,2320-3110,NA,0,0,1,0,Mathematics,NA,NA,RAMANUJAN MATHEMATICAL SOC,NA +journal of the renin-angiotensin-aldosterone system,1470-3203,1752-8976,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,HINDAWI LTD,NA +journal of the royal anthropological institute,1359-0987,1467-9655,NA,0,1,0,0,NA,Anthropology,NA,WILEY,NA +journal of the royal asiatic society,1356-1863,1474-0591,NA,1,0,0,0,NA,NA,Asian Studies,CAMBRIDGE UNIV PRESS,NA +journal of the royal musical association,0269-0403,1471-6933,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +journal of the royal society interface,1742-5689,1742-5662,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,ROYAL SOC,NA +journal of the royal society of medicine,0141-0768,1758-1095,EditorJRSM,0,0,1,1,"Medicine, General & Internal",NA,NA,SAGE PUBLICATIONS LTD,2010-04-26 +journal of the royal society of new zealand,0303-6758,1175-8899,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +journal of the royal statistical society series a-statistics in society,0964-1998,1467-985X,NA,0,1,1,0,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,WILEY,NA +journal of the royal statistical society series a-statistics in society,0964-1998,1467-985X,NA,0,1,1,0,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,WILEY,NA +journal of the royal statistical society series b-statistical methodology,1369-7412,1467-9868,NA,0,0,1,0,Statistics & Probability,NA,NA,WILEY,NA +journal of the royal statistical society series c-applied statistics,0035-9254,1467-9876,NA,0,0,1,0,Statistics & Probability,NA,NA,WILEY,NA +journal of the science of food and agriculture,0022-5142,1097-0010,NA,0,0,1,0,"Agriculture, Multidisciplinary | Chemistry, Applied | Food Science & Technology",NA,NA,WILEY,NA +journal of the serbian chemical society,0352-5139,0352-5139,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SERBIAN CHEMICAL SOC,NA +journal of the society for american music,1752-1963,1752-1971,JSAMMusic,1,0,0,1,NA,NA,Music,CAMBRIDGE UNIV PRESS,2012-03-21 +journal of the society for information display,1071-0922,1938-3657,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary | Optics | Physics, Applied",NA,NA,WILEY,NA +journal of the society for social work and research,2334-2315,1948-822X,NA,0,1,0,0,NA,Social Work,NA,UNIV CHICAGO PRESS,NA +journal of the society of architectural historians,0037-9808,2150-5926,NA,1,0,0,0,NA,NA,Architecture,SOC ARCHITECTURAL HISTORIANS,NA +journal of the society of christian ethics,1540-7942,2326-2176,NA,1,0,0,0,NA,NA,Religion,SOC CHRISTIAN ETHICS,NA +journal of the society of leather technologists and chemists,0144-0322,0144-0322,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,SOC LEATHER TECHNOL CHEMISTS,NA +journal of the south african institution of civil engineering,1021-2019,2309-8775,NA,0,0,1,0,"Engineering, Civil",NA,NA,SAICE-SAISI,NA +journal of the south african veterinary association,1019-9128,2224-9435,NA,0,0,1,0,Veterinary Sciences,NA,NA,AOSIS,NA +journal of the southern african institute of mining and metallurgy,2225-6253,2411-9717,NA,0,0,1,0,Metallurgy & Metallurgical Engineering | Mining & Mineral Processing,NA,NA,SOUTHERN AFRICAN INST MINING METALLURGY,NA +journal of the southwest,0894-8410,2158-1371,jsw_uaz,1,0,0,1,NA,NA,History,UNIV ARIZONA,2019-08-19 +journal of the taiwan institute of chemical engineers,1876-1070,1876-1089,NA,0,0,1,0,"Engineering, Chemical",NA,NA,ELSEVIER,NA +journal of the textile institute,0040-5000,1754-2340,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of the torrey botanical society,1095-5674,1940-0616,NA,0,0,1,0,Plant Sciences,NA,NA,TORREY BOTANICAL SOC,NA +journal of the warburg and courtauld institutes,0075-4390,2044-0014,NA,1,0,0,0,NA,NA,Art,WARBURG INST,NA +journal of the west,0022-5169,1930-0115,NA,1,0,0,0,NA,NA,History,ABC-CLIO,NA +journal of the world aquaculture society,0893-8849,1749-7345,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +journal of theological studies,0022-5185,1477-4607,NA,1,0,0,0,NA,NA,Religion,OXFORD UNIV PRESS,NA +journal of theoretical and applied electronic commerce research,0718-1876,0718-1876,NA,0,1,0,0,NA,Business,NA,MDPI,NA +journal of theoretical and applied mechanics,1429-2955,1429-2955,NA,0,0,1,0,Mechanics,NA,NA,POLISH SOC THEORETICAL & APPLIED MECHANICS,NA +journal of theoretical and computational acoustics,2591-7285,2591-7811,NA,0,0,1,0,"Acoustics | Mathematics, Interdisciplinary Applications",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of theoretical biology,0022-5193,1095-8541,NA,0,0,1,0,Biology | Mathematical & Computational Biology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +journal of theoretical politics,0951-6298,1460-3667,jthpol,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS LTD,2015-09-16 +journal of theoretical probability,0894-9840,1572-9230,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of thermal analysis and calorimetry,1388-6150,1588-2926,NA,0,0,1,0,"Thermodynamics | Chemistry, Analytical | Chemistry, Physical",NA,NA,SPRINGER,NA +journal of thermal biology,0306-4565,1879-0992,NA,0,0,1,0,Biology | Zoology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +journal of thermal science,1003-2169,1993-033X,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,SPRINGER,NA +journal of thermal science and engineering applications,1948-5085,1948-5093,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,ASME,NA +journal of thermal science and technology,1880-5566,1880-5566,NA,0,0,1,0,Thermodynamics,NA,NA,JAPAN SOC MECHANICAL ENGINEERS,NA +journal of thermal spray technology,1059-9630,1544-1016,NA,0,0,1,0,"Materials Science, Coatings & Films",NA,NA,SPRINGER,NA +journal of thermal stresses,0149-5739,1521-074X,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,TAYLOR & FRANCIS INC,NA +journal of thermophysics and heat transfer,0887-8722,1533-6808,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,AMER INST AERONAUTICS ASTRONAUTICS,NA +journal of thermoplastic composite materials,0892-7057,1530-7980,NA,0,0,1,0,"Materials Science, Composites",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of thoracic and cardiovascular surgery,0022-5223,1097-685X,NA,0,0,1,0,Cardiac & Cardiovascular System | Respiratory System | Surgery,NA,NA,MOSBY-ELSEVIER,NA +journal of thoracic disease,2072-1439,2077-6624,NA,0,0,1,0,Respiratory System,NA,NA,AME PUBL CO,NA +journal of thoracic imaging,0883-5993,1536-0237,ThoracicImaging,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-04-14 +journal of thoracic oncology,1556-0864,1556-1380,NA,0,0,1,0,Oncology | Respiratory System,NA,NA,ELSEVIER SCIENCE INC,NA +journal of thrombosis and haemostasis,1538-7933,1538-7836,NA,0,0,1,0,Hematology | Peripheral Vascular Diseases,NA,NA,WILEY,NA +journal of thrombosis and thrombolysis,0929-5305,1573-742X,NA,0,0,1,0,Cardiac & Cardiovascular System | Hematology | Peripheral Vascular Diseases,NA,NA,SPRINGER,NA +journal of time series analysis,0143-9782,1467-9892,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,WILEY,NA +journal of tissue engineering,2041-7314,2041-7314,JTissEng,0,0,1,1,Cell & Tissue Engineering,NA,NA,SAGE PUBLICATIONS INC,2011-01-02 +journal of tissue engineering and regenerative medicine,1932-6254,1932-7005,NA,0,0,1,0,"Cell & Tissue Engineering | Biotechnology & Applied Microbiology | Cell Biology | Engineering, Biomedical",NA,NA,WILEY,NA +journal of tissue viability,0965-206X,1876-4746,NA,0,1,1,0,Dermatology | Nursing,Nursing,NA,ELSEVIER SCI LTD,NA +journal of tissue viability,0965-206X,1876-4746,NA,0,1,1,0,Dermatology | Nursing,Nursing,NA,ELSEVIER SCI LTD,NA +journal of topology,1753-8416,1753-8424,NA,0,0,1,0,Mathematics,NA,NA,WILEY,NA +journal of topology and analysis,1793-5253,1793-7167,NA,0,0,1,0,Mathematics,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +journal of tourism and cultural change,1476-6825,1747-7654,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of toxicologic pathology,0914-9198,1881-915X,NA,0,0,1,0,Pathology | Toxicology,NA,NA,JAPANESE SOC TOXICOLOGIC PATHOLOGY,NA +journal of toxicological sciences,0388-1350,1880-3989,NA,0,0,1,0,Toxicology,NA,NA,JAPANESE SOC TOXICOLOGICAL SCIENCES,NA +journal of toxicology and environmental health-part a-current issues,1528-7394,1087-2620,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health | Toxicology",NA,NA,TAYLOR & FRANCIS INC,NA +journal of toxicology and environmental health-part b-critical reviews,1093-7404,1521-6950,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health | Toxicology",NA,NA,TAYLOR & FRANCIS INC,NA +journal of trace elements in medicine and biology,0946-672X,1878-3252,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,ELSEVIER GMBH,NA +journal of traditional and complementary medicine,2225-4110,2225-4110,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,ELSEVIER,NA +journal of traditional chinese medicine,0255-2922,1577-7014,NA,0,0,1,0,Integrative & Complementary Medicine,NA,NA,JOURNAL TRADITIONAL CHINESE MED,NA +journal of transcultural nursing,1043-6596,1552-7832,NA,0,1,1,0,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +journal of transcultural nursing,1043-6596,1552-7832,NA,0,1,1,0,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +journal of translational internal medicine,2450-131X,2224-4018,JTIMjournal,0,0,1,1,"Medicine, General & Internal",NA,NA,SCIENDO,2021-01-04 +journal of translational medicine,1479-5876,1479-5876,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,BMC,NA +journal of transport & health,2214-1405,2214-1413,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Transportation",NA,ELSEVIER SCI LTD,NA +journal of transport and land use,1938-7849,1938-7849,NA,0,1,0,0,NA,Transportation,NA,"UNIV MINNESOTA, CENTER TRANSPORTATION STUDIES",NA +journal of transport economics and policy,0022-5258,1754-5951,NA,0,1,0,0,NA,Economics | Transportation,NA,UNIV BATH,NA +journal of transport geography,0966-6923,1873-1236,NA,0,1,0,0,NA,Economics | Geography | Transportation,NA,ELSEVIER SCI LTD,NA +journal of transportation engineering part a-systems,2473-2907,2473-2893,NA,0,0,1,0,"Engineering, Civil | Transportation Science & Technology",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of transportation engineering part b-pavements,2573-5438,2573-5438,NA,0,0,1,0,"Engineering, Civil | Transportation Science & Technology",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of transportation safety & security,1943-9962,1943-9970,NA,0,1,0,0,NA,Transportation,NA,TAYLOR & FRANCIS INC,NA +journal of trauma & dissociation,1529-9732,1529-9740,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of trauma and acute care surgery,2163-0755,2163-0763,JTraumAcuteSurg,0,0,1,1,Critical Care Medicine | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-06-08 +journal of trauma nursing,1078-7496,1932-3883,JTN_online,0,1,1,1,Critical Care Medicine | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-01-24 +journal of trauma nursing,1078-7496,1932-3883,JTN_online,0,1,1,1,Critical Care Medicine | Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-01-24 +journal of traumatic stress,0894-9867,1573-6598,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,WILEY,NA +journal of travel & tourism marketing,1054-8408,1540-7306,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of travel medicine,1195-1982,1708-8305,jtravmed,0,0,1,1,"Public, Environmental & Occupational Health | Infectious Diseases | Medicine, General & Internal",NA,NA,OXFORD UNIV PRESS INC,2017-05-26 +journal of travel research,0047-2875,1552-6763,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism",NA,SAGE PUBLICATIONS INC,NA +journal of tribology-transactions of the asme,0742-4787,1528-8897,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASME,NA +journal of tropical ecology,0266-4674,1469-7831,j_trop_ecol,0,0,1,1,Ecology,NA,NA,CAMBRIDGE UNIV PRESS,NA +journal of tropical forest science,0128-1283,0128-1283,NA,0,0,1,0,Forestry,NA,NA,FOREST RESEARCH INST MALAYSIA,NA +journal of tropical medicine,1687-9686,1687-9694,NA,0,0,1,0,"Public, Environmental & Occupational Health | Tropical Medicine",NA,NA,HINDAWI LTD,NA +journal of tropical meteorology,1006-8775,1006-8775,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,JOURNAL OF TROPICAL METEOROLOGICAL PRESS,NA +journal of tropical pediatrics,0142-6338,1465-3664,JTropPeds,0,0,1,1,Pediatrics | Tropical Medicine,NA,NA,OXFORD UNIV PRESS,2020-08-17 +journal of turbomachinery-transactions of the asme,0889-504X,1528-8900,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASME,NA +journal of turbulence,1468-5248,1468-5248,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,TAYLOR & FRANCIS LTD,NA +journal of ultrasound in medicine,0278-4297,1550-9613,NA,0,0,1,0,"Acoustics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,NA +journal of universal computer science,0948-695X,0948-6968,NA,0,0,1,0,"Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,"GRAZ UNIV TECHNOLGOY, INST INFORMATION SYSTEMS COMPUTER MEDIA-IICM",NA +journal of urban affairs,0735-2166,1467-9906,JUAurban,0,1,0,1,NA,Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-04-26 +journal of urban economics,0094-1190,1095-9068,JUrbanEcon,0,1,0,1,NA,Economics | Urban Studies,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2021-01-05 +journal of urban health-bulletin of the new york academy of medicine,1099-3460,1468-2869,NA,0,0,1,0,"Public, Environmental & Occupational Health | Medicine, General & Internal",NA,NA,SPRINGER,NA +journal of urban history,0096-1442,1552-6771,NA,1,1,0,0,NA,History Of Social Sciences | Urban Studies,History,SAGE PUBLICATIONS INC,NA +journal of urban history,0096-1442,1552-6771,NA,1,1,0,0,NA,History Of Social Sciences | Urban Studies,History,SAGE PUBLICATIONS INC,NA +journal of urban planning and development,0733-9488,1943-5444,NA,0,1,1,0,"Engineering, Civil",Regional & Urban Planning | Urban Studies,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of urban planning and development,0733-9488,1943-5444,NA,0,1,1,0,"Engineering, Civil",Regional & Urban Planning | Urban Studies,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of urban technology,1063-0732,1466-1853,NA,0,1,0,0,NA,Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of urology,0022-5347,1527-3792,JUrology,0,0,1,1,Urology & Nephrology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-06-01 +journal of vacation marketing,1356-7667,1479-1870,NA,0,1,0,0,NA,"Business | Hospitality, Leisure, Sport & Tourism",NA,SAGE PUBLICATIONS LTD,NA +journal of vacuum science & technology a,0734-2101,1520-8559,NA,0,0,1,0,"Materials Science, Coatings & Films | Physics, Applied",NA,NA,A V S AMER INST PHYSICS,NA +journal of vacuum science & technology b,2166-2746,2166-2754,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Physics, Applied",NA,NA,A V S AMER INST PHYSICS,NA +journal of value inquiry,0022-5363,1573-0492,NA,1,1,0,0,NA,Ethics,Philosophy,SPRINGER,NA +journal of value inquiry,0022-5363,1573-0492,NA,1,1,0,0,NA,Ethics,Philosophy,SPRINGER,NA +journal of vascular access,1129-7298,1724-6032,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS LTD,NA +journal of vascular and interventional radiology,1051-0443,1535-7732,JVIRmedia,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging | Peripheral Vascular Diseases",NA,NA,ELSEVIER SCIENCE INC,2014-02-03 +journal of vascular research,1018-1172,1423-0135,JournalVascRes,0,0,1,1,Physiology | Peripheral Vascular Diseases,NA,NA,KARGER,2018-01-30 +journal of vascular surgery,0741-5214,1097-6809,JVascSurg,0,0,1,1,Surgery | Peripheral Vascular Diseases,NA,NA,MOSBY-ELSEVIER,2017-01-09 +journal of vascular surgery-venous and lymphatic disorders,2213-333X,2213-333X,NA,0,0,1,0,Surgery | Peripheral Vascular Diseases,NA,NA,ELSEVIER,NA +journal of vector borne diseases,0972-9062,0972-9062,NA,0,0,1,0,Infectious Diseases | Parasitology | Tropical Medicine,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +journal of vector ecology,1081-1710,1948-7134,NA,0,0,1,0,Entomology,NA,NA,SOC VECTOR ECOLOGY,NA +journal of vegetation science,1100-9233,1654-1103,NA,0,0,1,0,Plant Sciences | Ecology | Forestry,NA,NA,WILEY,NA +journal of venomous animals and toxins including tropical diseases,1678-9199,1678-9199,JVATiTD,0,0,1,1,Toxicology | Tropical Medicine,NA,NA,CEVAP-SAO PAULO STATE UNIV-UNESP,2012-01-05 +journal of vertebrate biology,2694-7684,2694-7684,NA,0,0,1,0,Zoology,NA,NA,INST VERTEBRATE BIOLOGY AS CR,NA +journal of vertebrate paleontology,0272-4634,1937-2809,JVP_vertpaleo,0,0,1,1,Paleontology,NA,NA,TAYLOR & FRANCIS INC,2021-05-10 +journal of vestibular research-equilibrium & orientation,0957-4271,1878-6464,NA,0,0,1,0,Neurosciences | Otorhinolaryngology,NA,NA,IOS PRESS,NA +journal of veterinary behavior-clinical applications and research,1558-7878,1878-7517,NA,0,0,1,0,Behavioral Sciences | Veterinary Sciences,NA,NA,ELSEVIER SCIENCE INC,NA +journal of veterinary cardiology,1760-2734,1875-0834,NA,0,0,1,0,Veterinary Sciences,NA,NA,ELSEVIER,NA +journal of veterinary dentistry,0898-7564,2470-4083,NA,0,0,1,0,Veterinary Sciences,NA,NA,SAGE PUBLICATIONS INC,NA +journal of veterinary diagnostic investigation,1040-6387,1943-4936,jvdi_aavld,0,0,1,1,Veterinary Sciences,NA,NA,SAGE PUBLICATIONS INC,2019-01-23 +journal of veterinary emergency and critical care,1479-3261,1476-4431,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +journal of veterinary internal medicine,0891-6640,1939-1676,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +journal of veterinary medical education,0748-321X,1943-7218,JVME_AAVMC,0,0,1,1,"Education, Scientific Disciplines | Veterinary Sciences",NA,NA,UNIV TORONTO PRESS INC,2021-06-24 +journal of veterinary medical science,0916-7250,1347-7439,NA,0,0,1,0,Veterinary Sciences,NA,NA,JAPAN SOC VET SCI,NA +journal of veterinary pharmacology and therapeutics,0140-7783,1365-2885,NA,0,0,1,0,Pharmacology & Pharmacy | Veterinary Sciences,NA,NA,WILEY,NA +journal of veterinary research,2450-7393,2450-8608,NA,0,0,1,0,Veterinary Sciences,NA,NA,SCIENDO,NA +journal of veterinary science,1229-845X,1976-555X,NA,0,0,1,0,Veterinary Sciences,NA,NA,KOREAN SOC VETERINARY SCIENCE,NA +journal of vibration and acoustics-transactions of the asme,1048-9002,1528-8927,NA,0,0,1,0,"Acoustics | Engineering, Mechanical | Mechanics",NA,NA,ASME,NA +journal of vibration and control,1077-5463,1741-2986,NA,0,0,1,0,"Acoustics | Engineering, Mechanical | Mechanics",NA,NA,SAGE PUBLICATIONS LTD,NA +journal of vibration engineering & technologies,2523-3920,2523-3939,NA,0,0,1,0,"Mechanics | Engineering, Mechanical",NA,NA,SPRINGER HEIDELBERG,NA +journal of victorian culture,1355-5502,1750-0133,jofvictculture,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2011-05-16 +journal of victorian culture,1355-5502,1750-0133,jofvictculture,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2011-05-16 +journal of vinyl & additive technology,1083-5601,1548-0585,NA,0,0,1,0,"Chemistry, Applied | Materials Science, Textiles | Polymer Science",NA,NA,WILEY,NA +journal of viral hepatitis,1352-0504,1365-2893,NA,0,0,1,0,Gastroenterology & Hepatology | Infectious Diseases | Virology,NA,NA,WILEY,NA +journal of virological methods,0166-0934,1879-0984,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology | Virology,NA,NA,ELSEVIER,NA +journal of virology,0022-538X,1098-5514,JVirology,0,0,1,1,Virology,NA,NA,AMER SOC MICROBIOLOGY,2015-10-03 +journal of virus eradication,2055-6640,2055-6659,viruseradicate,0,0,1,1,Immunology | Infectious Diseases | Virology,NA,NA,MEDISCRIPT LTD,2014-10-07 +journal of visceral surgery,1878-7886,1878-7886,NA,0,0,1,0,Surgery,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",NA +journal of vision,1534-7362,1534-7362,ARVOJOV,0,0,1,1,Ophthalmology,NA,NA,ASSOC RESEARCH VISION OPHTHALMOLOGY INC,2013-08-05 +journal of visual communication and image representation,1047-3203,1095-9076,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of visual culture,1470-4129,1741-2994,JVCJournal,1,1,0,1,NA,Cultural Studies,Cultural Studies | Art,SAGE PUBLICATIONS INC,2014-11-03 +journal of visual culture,1470-4129,1741-2994,JVCJournal,1,1,0,1,NA,Cultural Studies,Cultural Studies | Art,SAGE PUBLICATIONS INC,2014-11-03 +journal of visual impairment & blindness,0145-482X,1559-1476,NA,0,1,0,0,NA,Rehabilitation,NA,SAGE PUBLICATIONS INC,NA +journal of visualization,1343-8875,1875-8975,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Imaging Science & Photographic Technology",NA,NA,SPRINGER,NA +journal of vocational behavior,0001-8791,1095-9084,NA,0,1,0,0,NA,"Psychology, Applied",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +journal of voice,0892-1997,1873-4588,NA,0,0,1,0,Audiology & Speech-Language Pathology | Otorhinolaryngology,NA,NA,MOSBY-ELSEVIER,NA +journal of volcanology and geothermal research,0377-0273,1872-6097,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +journal of volcanology and seismology,0742-0463,1819-7108,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,PLEIADES PUBLISHING INC,NA +journal of water and climate change,2040-2244,2408-9354,NA,0,0,1,0,Water Resources,NA,NA,IWA PUBLISHING,NA +journal of water and health,1477-8920,1996-7829,NA,0,0,1,0,Environmental Sciences | Microbiology,NA,NA,IWA PUBLISHING,NA +journal of water chemistry and technology,1063-455X,1934-936X,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Analytical | Chemistry, Physical",NA,NA,PLEIADES PUBLISHING INC,NA +journal of water process engineering,2214-7144,2214-7144,NA,0,0,1,0,"Engineering, Environmental | Engineering, Chemical | Water Resources",NA,NA,ELSEVIER,NA +journal of water resources planning and management,0733-9496,1943-5452,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of water sanitation and hygiene for development,2043-9083,2408-9362,NA,0,0,1,0,Water Resources,NA,NA,IWA PUBLISHING,NA +journal of waterway port coastal and ocean engineering,0733-950X,1943-5460,NA,0,0,1,0,"Engineering, Civil | Engineering, Ocean | Water Resources",NA,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +journal of web engineering,1540-9589,1544-5976,NA,0,0,1,0,"Computer Science, Software Engineering | Computer Science, Theory & Methods",NA,NA,RIVER PUBLISHERS,NA +journal of web semantics,1570-8268,1873-7749,journalWebSem,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,ELSEVIER,2009-10-27 +journal of wildlife diseases,0090-3558,1943-3700,NA,0,0,1,0,Veterinary Sciences,NA,NA,"WILDLIFE DISEASE ASSOC, INC",NA +journal of wildlife management,0022-541X,1937-2817,NA,0,0,1,0,Ecology | Zoology,NA,NA,WILEY,NA +journal of wind engineering and industrial aerodynamics,0167-6105,1872-8197,NA,0,0,1,0,"Engineering, Civil | Mechanics",NA,NA,ELSEVIER,NA +journal of wine economics,1931-4361,1931-437X,NA,0,1,1,0,Agricultural Economics & Policy | Food Science & Technology,Economics,NA,CAMBRIDGE UNIV PRESS,NA +journal of wine economics,1931-4361,1931-437X,NA,0,1,1,0,Agricultural Economics & Policy | Food Science & Technology,Economics,NA,CAMBRIDGE UNIV PRESS,NA +journal of women & aging,0895-2841,1540-7322,NA,0,1,0,0,NA,Gerontology | Women'S Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +journal of women politics & policy,1554-477X,1554-4788,journalwpp,0,1,0,1,NA,Political Science | Women'S Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-03-26 +journal of womens health,1540-9996,1931-843X,NA,0,1,1,0,"Public, Environmental & Occupational Health | Medicine, General & Internal | Obstetrics & Gynecology","Public, Environmental & Occupational Health | Women'S Studies",NA,"MARY ANN LIEBERT, INC",NA +journal of womens health,1540-9996,1931-843X,NA,0,1,1,0,"Public, Environmental & Occupational Health | Medicine, General & Internal | Obstetrics & Gynecology","Public, Environmental & Occupational Health | Women'S Studies",NA,"MARY ANN LIEBERT, INC",NA +journal of womens history,1042-7961,1527-2036,JournWomensHist,1,1,0,1,NA,History | Women'S Studies,History,JOHNS HOPKINS UNIV PRESS,2016-01-15 +journal of womens history,1042-7961,1527-2036,JournWomensHist,1,1,0,1,NA,History | Women'S Studies,History,JOHNS HOPKINS UNIV PRESS,2016-01-15 +journal of wood chemistry and technology,0277-3813,1532-2319,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,TAYLOR & FRANCIS INC,NA +journal of wood science,1435-0211,1611-4663,NA,0,0,1,0,"Forestry | Materials Science, Paper & Wood",NA,NA,SPRINGER JAPAN KK,NA +journal of work and organizational psychology-revista de psicologia del trabajo y de las organizaciones,1576-5962,2174-0534,NA,0,1,0,0,NA,"Psychology, Applied",NA,COLEGIO OFICIAL PSICOLOGOS MADRID,NA +journal of world business,1090-9516,1878-5573,JWBNews,0,1,0,1,NA,Business,NA,ELSEVIER SCIENCE INC,2015-08-13 +journal of world energy law & business,1754-9957,1754-9965,NA,0,1,0,0,NA,Business | Law,NA,OXFORD UNIV PRESS,NA +journal of world history,1045-6007,1527-8050,NA,1,0,0,0,NA,NA,History,UNIV HAWAII PRESS,NA +journal of world prehistory,0892-7537,1573-7802,NA,1,1,0,0,NA,Anthropology,Archaeology,SPRINGER,NA +journal of world prehistory,0892-7537,1573-7802,NA,1,1,0,0,NA,Anthropology,Archaeology,SPRINGER,NA +journal of world trade,1011-6702,2210-2795,NA,0,1,0,0,NA,Economics | International Relations | Law,NA,KLUWER LAW INT,NA +journal of wound care,0969-0700,2062-2916,JWCeditor,0,0,1,1,Dermatology,NA,NA,MA HEALTHCARE LTD,2009-12-04 +journal of wound ostomy and continence nursing,1071-5754,1528-3976,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of wound ostomy and continence nursing,1071-5754,1528-3976,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +journal of wuhan university of technology-materials science edition,1000-2413,1993-0437,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,WUHAN UNIV TECHNOLOGY,NA +journal of x-ray science and technology,0895-3996,1095-9114,NA,0,0,1,0,"Instruments & Instrumentation | Optics | Physics, Applied",NA,NA,IOS PRESS,NA +journal of youth and adolescence,0047-2891,1573-6601,NA,0,1,0,0,NA,"Psychology, Development",NA,SPRINGER/PLENUM PUBLISHERS,NA +journal of youth studies,1367-6261,1469-9680,JofYS,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-06-04 +journal of zhejiang university-science a,1673-565X,1862-1775,NA,0,0,1,0,"Engineering, Multidisciplinary | Physics, Applied",NA,NA,ZHEJIANG UNIV PRESS,NA +journal of zhejiang university-science b,1673-1581,1862-1783,NA,0,0,1,0,"Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Medicine, Research & Experimental",NA,NA,ZHEJIANG UNIV PRESS,NA +journal of zoo and wildlife medicine,1042-7260,1937-2825,NA,0,0,1,0,Veterinary Sciences,NA,NA,AMER ASSOC ZOO VETERINARIANS,NA +journal of zoological systematics and evolutionary research,0947-5745,1439-0469,NA,0,0,1,0,Evolutionary Biology | Zoology,NA,NA,WILEY,NA +journal of zoology,0952-8369,1469-7998,JZoology,0,0,1,1,Zoology,NA,NA,WILEY,2012-02-03 +journal on multimodal user interfaces,1783-7677,1783-8738,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Cybernetics",NA,NA,SPRINGER,NA +journalism,1464-8849,1741-3001,NA,0,1,0,0,NA,Communication,NA,SAGE PUBLICATIONS INC,NA +journalism & mass communication quarterly,1077-6990,2161-430X,jmcquarterly,0,1,0,1,NA,Communication,NA,SAGE PUBLICATIONS INC,2020-08-24 +journalism practice,1751-2786,1751-2794,journpractice,0,1,0,1,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-04-04 +journalism studies,1461-670X,1469-9699,journstudies,0,1,0,1,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-12-15 +journals of gerontology series a-biological sciences and medical sciences,1079-5006,1758-535X,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,OXFORD UNIV PRESS INC,NA +journals of gerontology series a-biological sciences and medical sciences,1079-5006,1758-535X,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,OXFORD UNIV PRESS INC,NA +journals of gerontology series b-psychological sciences and social sciences,1079-5014,1758-5368,NA,0,1,1,0,Geriatrics & Gerontology | Psychology,"Gerontology | Psychology, Multidisciplinary",NA,OXFORD UNIV PRESS INC,NA +journals of gerontology series b-psychological sciences and social sciences,1079-5014,1758-5368,NA,0,1,1,0,Geriatrics & Gerontology | Psychology,"Gerontology | Psychology, Multidisciplinary",NA,OXFORD UNIV PRESS INC,NA +jove-journal of visualized experiments,1940-087X,1940-087X,JoVEJournal,0,0,1,1,Multidisciplinary Sciences,NA,NA,JOURNAL OF VISUALIZED EXPERIMENTS,2009-05-30 +jpad-journal of prevention of alzheimers disease,2274-5807,2426-0266,NA,0,0,1,0,Clinical Neurology,NA,NA,SPRINGER BASEL AG,NA +jpc-journal of planar chromatography-modern tlc,0933-4173,1789-0993,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,SPRINGER HEIDELBERG,NA +jsls-journal of the society of laparoendoscopic surgeons,1086-8089,1938-3797,NA,0,0,1,0,Surgery,NA,NA,SOC LAPAROENDOSCOPIC SURGEONS,NA +judaica bohemiae,0022-5738,0022-5738,NA,1,0,0,0,NA,NA,Religion,ZIDOVSKE MUZEUM PRAZE,NA +judgment and decision making,1930-2975,1930-2975,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SOC JUDGMENT & DECISION MAKING,NA +junctures-the journal for thematic dialogue,1176-5119,1179-8912,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",OTAGO POLYTECHNIC-TE KURA MATATINI KI OTAGO,NA +jundishapur journal of microbiology,2008-3645,2008-4161,NA,0,0,1,0,Microbiology,NA,NA,KOWSAR PUBL,NA +jung journal-culture & psyche,1934-2039,1934-2047,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +justice quarterly,0741-8825,1745-9109,NA,0,1,0,0,NA,Criminology & Penology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +justice system journal,0098-261X,2327-7556,NA,0,1,0,0,NA,Law,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +juvenile and family court journal,0161-7109,1755-6988,NA,0,1,0,0,NA,Law,NA,WILEY,NA +kafkas universitesi veteriner fakultesi dergisi,1300-6045,1309-2251,NA,0,0,1,0,Veterinary Sciences,NA,NA,"KAFKAS UNIV, VETERINER FAKULTESI DERGISI",NA +kagaku kogaku ronbunshu,0386-216X,1349-9203,NA,0,0,1,0,"Engineering, Chemical",NA,NA,SOC CHEMICAL ENG JAPAN,NA +kant-studien,0022-8877,1613-1134,NA,1,0,0,0,NA,NA,Philosophy,WALTER DE GRUYTER GMBH,NA +kantian review,1369-4154,2044-2394,NA,1,0,0,0,NA,NA,Philosophy,CAMBRIDGE UNIV PRESS,NA +kaohsiung journal of medical sciences,1607-551X,2410-8650,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,WILEY,NA +kardiologia polska,0022-9032,1897-4279,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,POLISH CARDIAC SOC-POLSKIE TOWARZYSTWO KARDIOLOGICZNE,NA +kardiologiya,0022-9040,2412-5660,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,RUSSIAN HEART FAILURE SOC,NA +keats-shelley journal,0453-4387,NA,NA,1,0,0,0,NA,NA,Poetry,KEATS-SHELLEY ASSOC AMER INC,NA +keats-shelley review,0952-4142,2042-1362,NA,1,0,0,0,NA,NA,Poetry,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +kedi journal of educational policy,1739-4341,1739-4341,NA,0,1,0,0,NA,Education & Educational Research,NA,KOREAN EDUCATIONAL DEVELOPMENTAL INST,NA +kennedy institute of ethics journal,1054-6863,1086-3249,NA,1,1,0,0,NA,Ethics | Social Issues,Philosophy,JOHNS HOPKINS UNIV PRESS,NA +kennedy institute of ethics journal,1054-6863,1086-3249,NA,1,1,0,0,NA,Ethics | Social Issues,Philosophy,JOHNS HOPKINS UNIV PRESS,NA +kenyon review,0163-075X,2327-8307,kenyonreview,1,0,0,1,NA,NA,Literary Reviews,KENYON COLLEGE,2010-07-22 +kerntechnik,0932-3902,2195-8580,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,WALTER DE GRUYTER GMBH,NA +kew bulletin,0075-5974,1874-933X,KewBulletin,0,0,1,1,Plant Sciences,NA,NA,SPRINGER LONDON LTD,2013-05-15 +kgk-kautschuk gummi kunststoffe,0948-3276,0948-3276,NA,0,0,1,0,"Engineering, Chemical | Polymer Science",NA,NA,DR ALFRED HUTHIG VERLAG GMBH,NA +kidney & blood pressure research,1420-4096,1423-0143,NA,0,0,1,0,Physiology | Urology & Nephrology | Peripheral Vascular Diseases,NA,NA,KARGER,NA +kidney diseases,2296-9381,2296-9357,NA,0,0,1,0,Urology & Nephrology,NA,NA,KARGER,NA +kidney international,0085-2538,1523-1755,Kidney_Int,0,0,1,1,Urology & Nephrology,NA,NA,ELSEVIER SCIENCE INC,2018-03-18 +kidney international reports,2468-0249,2468-0249,KIReports,0,0,1,1,Urology & Nephrology,NA,NA,ELSEVIER SCIENCE INC,2017-09-27 +kidney international supplements,2157-1724,2157-1716,NA,0,0,1,0,Urology & Nephrology,NA,NA,ELSEVIER SCIENCE INC,NA +kidney research and clinical practice,2211-9132,2211-9140,NA,0,0,1,0,Urology & Nephrology,NA,NA,KOREAN SOC NEPHROLOGY,NA +kindheit und entwicklung,0942-5403,2190-6246,NA,0,1,0,0,NA,"Psychology, Development",NA,HOGREFE VERLAG,NA +kinematics and physics of celestial bodies,0884-5913,1934-8401,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,PLEIADES PUBLISHING INC,NA +kinesiology,1331-1441,1848-638X,NA,0,1,1,0,Rehabilitation | Sport Sciences,Rehabilitation,NA,"UNIV ZAGREB, FAC KINESIOLOGY",NA +kinesiology,1331-1441,1848-638X,NA,0,1,1,0,Rehabilitation | Sport Sciences,Rehabilitation,NA,"UNIV ZAGREB, FAC KINESIOLOGY",NA +kinetic and related models,1937-5093,1937-5077,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +kinetics and catalysis,0023-1584,1608-3210,NA,0,0,1,0,"Chemistry, Physical",NA,NA,PLEIADES PUBLISHING INC,NA +kleintierpraxis,0023-2076,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,M H SCHAPER GMBH CO KG,NA +klinische monatsblatter fur augenheilkunde,0023-2165,1439-3999,NA,0,0,1,0,Ophthalmology,NA,NA,GEORG THIEME VERLAG KG,NA +klinische neurophysiologie,1434-0275,1439-4081,NA,0,0,1,0,Clinical Neurology | Neuroimaging | Physiology,NA,NA,GEORG THIEME VERLAG KG,NA +klinische padiatrie,0300-8630,1439-3824,NA,0,0,1,0,Pediatrics,NA,NA,GEORG THIEME VERLAG KG,NA +knee,0968-0160,1873-5800,TheKneeJournal,0,0,1,1,Orthopedics | Sport Sciences | Surgery,NA,NA,ELSEVIER,2016-11-15 +knee surgery sports traumatology arthroscopy,0942-2056,1433-7347,KSSTA,0,0,1,1,Orthopedics | Sport Sciences | Surgery,NA,NA,SPRINGER,2012-03-11 +knjizevna smotra,0455-0463,2459-6329,NA,1,0,0,0,NA,NA,"Literature, Slavic",FILOZOFSKI FAKULTET,NA +knowledge-based systems,0950-7051,1872-7409,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,ELSEVIER,NA +knowledge and information systems,0219-1377,0219-3116,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Information Systems",NA,NA,SPRINGER LONDON LTD,NA +knowledge and management of aquatic ecosystems,1961-9502,1961-9502,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,EDP SCIENCES S A,NA +knowledge engineering review,0269-8889,1469-8005,KER_journal,0,0,1,1,"Computer Science, Artificial Intelligence",NA,NA,CAMBRIDGE UNIV PRESS,2020-06-04 +knowledge management research & practice,1477-8238,1477-8246,NA,0,1,0,0,NA,Information Science & Library Science | Management,NA,TAYLOR & FRANCIS LTD,NA +knowledge organization,0943-7444,NA,NA,0,1,0,0,NA,Information Science & Library Science,NA,NOMOS VERLAGSGESELLSCHAFT MBH & CO KG,NA +kodai mathematical journal,0386-5991,0386-5991,NA,0,0,1,0,Mathematics,NA,NA,KINOKUNIYA CO LTD,NA +koedoe,0075-6458,2071-0771,KoedoeJournal,0,0,1,1,Biodiversity Conservation,NA,NA,AOSIS,2015-03-08 +kolner zeitschrift fur soziologie und sozialpsychologie,0023-2653,1861-891X,NA,0,1,0,0,NA,"Psychology, Social | Sociology",NA,SPRINGER VIEWEG-SPRINGER FACHMEDIEN WIESBADEN GMBH,NA +kona powder and particle journal,0288-4534,2187-5537,NA,0,0,1,0,"Engineering, Chemical | Materials Science, Multidisciplinary",NA,NA,HOSOKAWA POWDER TECHNOL FOUNDATION,NA +konsthistorisk tidskrift,0023-3609,1651-2294,NA,1,0,0,0,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +korea-australia rheology journal,1226-119X,2093-7660,NA,0,0,1,0,Mechanics | Polymer Science,NA,NA,KOREAN SOC RHEOLOGY,NA +korea journal,0023-3900,0023-3900,NA,1,0,0,0,NA,NA,Asian Studies,ACAD KOREAN STUDIES,NA +korea observer,0023-3919,0023-3919,NA,0,1,0,0,NA,Area Studies | International Relations,NA,INST KOREAN STUDIES,NA +korean circulation journal,1738-5520,1738-5555,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,KOREAN SOC CARDIOLOGY,NA +korean economic review,0254-3737,NA,NA,0,1,0,0,NA,Economics,NA,KOREAN ECONOMIC ASSOCIATION,NA +korean journal of chemical engineering,0256-1115,1975-7220,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,KOREAN INSTITUTE CHEMICAL ENGINEERS,NA +korean journal of defense analysis,1016-3271,1941-4641,NA,0,1,0,0,NA,International Relations,NA,KOREA INST DEFENSE ANALYSES-KIDA,NA +korean journal of internal medicine,1226-3303,2005-6648,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,KOREAN ASSOC INTERNAL MEDICINE,NA +korean journal of medical history,1225-505X,2093-5609,NA,1,0,0,0,NA,NA,History & Philosophy Of Science | Asian Studies,KOREAN SOC HIST MED,NA +korean journal of metals and materials,1738-8228,2288-8241,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,KOREAN INST METALS MATERIALS,NA +korean journal of orthodontics,2234-7518,2005-372X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,KOREAN ASSOC ORTHODONTISTS,NA +korean journal of pain,2005-9159,2093-0569,NA,0,0,1,0,Clinical Neurology,NA,NA,KOREAN PAIN SOC,NA +korean journal of parasitology,0023-4001,1738-0006,NA,0,0,1,0,Parasitology,NA,NA,"KOREAN SOC PARASITOLOGY, SEOUL NATL UNIV COLL MEDI",NA +korean journal of physiology & pharmacology,1226-4512,2093-3827,NA,0,0,1,0,Pharmacology & Pharmacy | Physiology,NA,NA,KOREAN JOURNAL OF PHYSIOLOGY & PHARMACOLOGY,NA +korean journal of radiology,1229-6929,2005-8330,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,KOREAN RADIOLOGICAL SOC,NA +kovove materialy-metallic materials,0023-432X,1338-4252,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,REDAKCIA KOVOVE MATERIALY,NA +kriterion-revista de filosofia,0100-512X,1981-5336,NA,1,0,0,0,NA,NA,Philosophy,"UNIV FED MINAS GERAIS, DEPT FILOSOFIA & CIENCIAS HUMANAS",NA +kritika-explorations in russian and eurasian history,1531-023X,1538-5000,kritikajournal,1,0,0,1,NA,NA,History,SLAVICA PUBLISHERS,2015-03-27 +kritika kultura,2094-6937,NA,KulturaKritika,1,0,0,1,NA,NA,Literature | Language & Linguistics,ATENEO DE MANILA UNIV,2012-06-16 +ksce journal of civil engineering,1226-7988,1976-3808,NA,0,0,1,0,"Engineering, Civil",NA,NA,KOREAN SOCIETY OF CIVIL ENGINEERS-KSCE,NA +ksii transactions on internet and information systems,1976-7277,1976-7277,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,KSII-KOR SOC INTERNET INFORMATION,NA +kunstiteaduslikke uurimusi,1406-2860,NA,NA,1,0,0,0,NA,NA,Art,ESTONIAN SOCIETY ART HISTORIANS,NA +kuwait journal of science,2307-4108,2307-4116,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,ACADEMIC PUBLICATION COUNCIL,NA +kuwait medical journal,0023-5776,0023-5776,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,KUWAIT MEDICAL ASSOC,NA +kwartalnik historii zydow-jewish history quarterly,1899-3044,1899-3044,NA,1,0,0,0,NA,NA,History,JEWISH HISTORICAL INST,NA +kybernetes,0368-492X,1758-7883,NA,0,0,1,0,"Computer Science, Cybernetics",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +kybernetika,0023-5954,1805-949X,NA,0,0,1,0,"Computer Science, Cybernetics",NA,NA,KYBERNETIKA,NA +kyklos,0023-5962,1467-6435,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +kyoto journal of mathematics,2156-2261,2154-3321,NA,0,0,1,0,Mathematics,NA,NA,DUKE UNIV PRESS,NA +kyushu journal of mathematics,1340-6116,1883-2032,NA,0,0,1,0,Mathematics,NA,NA,"KYUSHU UNIV, FAC MATHEMATICS",NA +lab animal,0093-7355,1548-4475,LA_NatRes,0,0,1,1,Veterinary Sciences,NA,NA,"NATURE PORTFOLIO",2016-03-21 +lab on a chip,1473-0197,1473-0189,LabonaChip,0,0,1,1,"Biochemical Research Methods | Chemistry, Multidisciplinary | Chemistry, Analytical | Nanoscience & Nanotechnology | Instruments & Instrumentation",NA,NA,ROYAL SOC CHEMISTRY,2009-03-10 +labor history,0023-656X,1469-9702,laborhistory123,1,1,0,1,NA,History Of Social Sciences | Industrial Relations & Labor,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-04-07 +labor history,0023-656X,1469-9702,laborhistory123,1,1,0,1,NA,History Of Social Sciences | Industrial Relations & Labor,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-04-07 +laboratory animals,0023-6772,1758-1117,NA,0,0,1,0,Veterinary Sciences | Zoology,NA,NA,SAGE PUBLICATIONS INC,NA +laboratory investigation,0023-6837,1530-0307,NA,0,0,1,0,"Medicine, Research & Experimental | Pathology",NA,NA,SPRINGERNATURE,NA +laboratory medicine,0007-5027,1943-7730,LabMedjournal,0,0,1,1,Medical Laboratory Technology,NA,NA,OXFORD UNIV PRESS,2019-08-02 +laboratory phonology,1868-6346,1868-6354,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,UBIQUITY PRESS LTD,NA +laboratory phonology,1868-6346,1868-6354,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,UBIQUITY PRESS LTD,NA +labour-le travail,0700-3862,1911-4842,NA,1,1,0,0,NA,History | Industrial Relations & Labor,History,CANADIAN COMMITTEE LABOUR HISTORY,NA +labour-le travail,0700-3862,1911-4842,NA,1,1,0,0,NA,History | Industrial Relations & Labor,History,CANADIAN COMMITTEE LABOUR HISTORY,NA +labour economics,0927-5371,1879-1034,NA,0,1,0,0,NA,Economics,NA,ELSEVIER,NA +labour history,0023-6942,1839-3039,NA,0,1,0,0,NA,History | Industrial Relations & Labor,NA,AUSTRALIAN SOC STUDY LABOUR HISTORY,NA +labour history review,0961-5652,1745-8188,NA,1,0,0,0,NA,NA,History,LIVERPOOL UNIV PRESS,NA +laeknabladid,0023-7213,1670-4959,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,LAEKNAFELAG ISLANDS-ICELANDIC MEDICAL ASSOC,NA +lake and reservoir management,1040-2381,2151-5530,NA,0,0,1,0,Limnology | Marine & Freshwater Biology | Water Resources,NA,NA,TAYLOR & FRANCIS INC,NA +lancet,0140-6736,1474-547X,TheLancet,0,0,1,1,"Medicine, General & Internal",NA,NA,ELSEVIER SCIENCE INC,2009-03-27 +lancet child & adolescent health,2352-4642,2352-4642,LancetChildAdol,0,0,1,1,Pediatrics,NA,NA,ELSEVIER SCI LTD,2017-01-09 +lancet diabetes & endocrinology,2213-8587,2213-8595,TheLancetEndo,0,0,1,1,Endocrinology & Metabolism,NA,NA,ELSEVIER SCIENCE INC,2013-11-11 +lancet digital health,2589-7500,2589-7500,LancetDigitalH,0,0,1,1,"Medical Informatics | Medicine, General & Internal",NA,NA,ELSEVIER,2019-01-04 +lancet gastroenterology & hepatology,2468-1253,2468-1253,LancetGastroHep,0,0,1,1,Gastroenterology & Hepatology,NA,NA,ELSEVIER INC,2016-02-22 +lancet global health,2214-109X,2214-109X,LancetGH,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,2013-03-18 +lancet global health,2214-109X,2214-109X,LancetGH,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,2013-03-18 +lancet haematology,2352-3026,2352-3026,TheLancetHaem,0,0,1,1,Hematology,NA,NA,ELSEVIER SCI LTD,2014-06-30 +lancet hiv,2352-3018,2352-3018,TheLancetHIV,0,0,1,1,Immunology | Infectious Diseases,NA,NA,ELSEVIER INC,2014-06-30 +lancet infectious diseases,1473-3099,1474-4457,TheLancetInfDis,0,0,1,1,Infectious Diseases,NA,NA,ELSEVIER SCI LTD,2014-03-06 +lancet neurology,1474-4422,1474-4465,TheLancetNeuro,0,0,1,1,Clinical Neurology,NA,NA,ELSEVIER SCIENCE INC,2014-03-06 +lancet oncology,1470-2045,1474-5488,TheLancetOncol,0,0,1,1,Oncology,NA,NA,ELSEVIER SCIENCE INC,2009-06-24 +lancet planetary health,2542-5196,2542-5196,TheLancetPlanet,0,1,1,1,"Environmental Sciences | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,2016-12-01 +lancet planetary health,2542-5196,2542-5196,TheLancetPlanet,0,1,1,1,"Environmental Sciences | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,2016-12-01 +lancet psychiatry,2215-0374,2215-0374,TheLancetPsych,0,1,1,1,Psychiatry,Psychiatry,NA,ELSEVIER SCI LTD,2014-03-07 +lancet psychiatry,2215-0374,2215-0374,TheLancetPsych,0,1,1,1,Psychiatry,Psychiatry,NA,ELSEVIER SCI LTD,2014-03-07 +lancet public health,2468-2667,2468-2667,TheLancetPH,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,2016-07-28 +lancet public health,2468-2667,2468-2667,TheLancetPH,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,2016-07-28 +lancet respiratory medicine,2213-2600,2213-2619,LancetRespirMed,0,0,1,1,Critical Care Medicine | Respiratory System,NA,NA,ELSEVIER SCI LTD,2014-03-06 +lancet rheumatology,2665-9913,2665-9913,TheLancetRheum,0,0,1,1,Rheumatology,NA,NA,ELSEVIER,2019-01-14 +land,2073-445X,2073-445X,Land_MDPI,0,1,0,1,NA,Environmental Studies,NA,MDPI,2015-09-18 +land degradation & development,1085-3278,1099-145X,NA,0,0,1,0,Environmental Sciences | Soil Science,NA,NA,WILEY,NA +land economics,0023-7639,1543-8325,Land_Econ,0,1,0,1,NA,Economics | Environmental Studies,NA,UNIV WISCONSIN PRESS,2018-04-24 +land use policy,0264-8377,1873-5754,NA,0,1,0,0,NA,Environmental Studies,NA,ELSEVIER SCI LTD,NA +landbauforschung-journal of sustainable and organic agricultural systems,0458-6859,2700-8711,landbauforsch,0,0,1,1,"Agriculture, Multidisciplinary",NA,NA,JOHANN HEINRICH VON THUNEN INST-VTI,2019-12-13 +landfall,0023-7930,NA,LandfallNZ,1,0,0,1,NA,NA,Literary Reviews,UNIV OTAGO PRESS,2013-11-21 +landscape and ecological engineering,1860-1871,1860-188X,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,SPRINGER JAPAN KK,NA +landscape and urban planning,0169-2046,1872-6062,NA,0,1,1,0,"Ecology | Geography, Physical",Environmental Studies | Geography | Regional & Urban Planning | Urban Studies,NA,ELSEVIER,NA +landscape and urban planning,0169-2046,1872-6062,NA,0,1,1,0,"Ecology | Geography, Physical",Environmental Studies | Geography | Regional & Urban Planning | Urban Studies,NA,ELSEVIER,NA +landscape architecture magazine,0023-8031,0023-8031,landarchmag,1,0,0,1,NA,NA,Architecture,AMER SOC LANDSCAPE ARCHITECTS,2009-06-19 +landscape ecology,0921-2973,1572-9761,NA,0,0,1,0,"Ecology | Geography, Physical | Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +landscape research,0142-6397,1469-9710,landscaperesj,0,1,0,1,NA,Environmental Studies | Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-12-12 +landslides,1612-510X,1612-5118,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,NA +langages,0458-726X,1958-9549,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ARMAND COLIN,NA +langages,0458-726X,1958-9549,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ARMAND COLIN,NA +langenbecks archives of surgery,1435-2443,1435-2451,NA,0,0,1,0,Surgery,NA,NA,SPRINGER,NA +langmuir,0743-7463,1520-5827,ACS_Langmuir,0,0,1,1,"Chemistry, Multidisciplinary | Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,AMER CHEMICAL SOC,2015-03-10 +language,0097-8507,1535-0665,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,LINGUISTIC SOC AMER,NA +language,0097-8507,1535-0665,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,LINGUISTIC SOC AMER,NA +language & communication,0271-5309,1873-3395,NA,0,1,0,0,NA,Communication | Linguistics,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +language & history,1759-7536,1759-7544,NA,1,1,0,0,NA,Linguistics,History | Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language & history,1759-7536,1759-7544,NA,1,1,0,0,NA,Linguistics,History | Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language acquisition,1048-9223,1532-7817,LangAcqJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-01-06 +language acquisition,1048-9223,1532-7817,LangAcqJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-01-06 +language and cognition,1866-9808,1866-9859,NA,1,1,0,0,NA,"Linguistics | Psychology, Experimental",Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +language and cognition,1866-9808,1866-9859,NA,1,1,0,0,NA,"Linguistics | Psychology, Experimental",Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +language and education,0950-0782,1747-7581,LanguageandEdu2,1,1,0,1,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-05-05 +language and education,0950-0782,1747-7581,LanguageandEdu2,1,1,0,1,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-05-05 +language and intercultural communication,1470-8477,1747-759X,LAICJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-12-21 +language and intercultural communication,1470-8477,1747-759X,LAICJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-12-21 +language and linguistics,1606-822X,1606-822X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +language and linguistics,1606-822X,1606-822X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +language and literature,0963-9470,1461-7293,LangLit_Journal,1,1,0,1,NA,Linguistics,Language & Linguistics,SAGE PUBLICATIONS LTD,2017-02-06 +language and literature,0963-9470,1461-7293,LangLit_Journal,1,1,0,1,NA,Linguistics,Language & Linguistics,SAGE PUBLICATIONS LTD,2017-02-06 +language and speech,0023-8309,1756-6053,NA,0,1,1,0,Audiology & Speech-Language Pathology,"Linguistics | Psychology, Experimental",NA,SAGE PUBLICATIONS LTD,NA +language and speech,0023-8309,1756-6053,NA,0,1,1,0,Audiology & Speech-Language Pathology,"Linguistics | Psychology, Experimental",NA,SAGE PUBLICATIONS LTD,NA +language assessment quarterly,1543-4303,1543-4311,NA,1,1,0,0,NA,"Psychology, Educational | Linguistics",Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language assessment quarterly,1543-4303,1543-4311,NA,1,1,0,0,NA,"Psychology, Educational | Linguistics",Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language awareness,0965-8416,1747-7565,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language awareness,0965-8416,1747-7565,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language cognition and neuroscience,2327-3798,2327-3801,NA,0,1,1,0,Audiology & Speech-Language Pathology | Behavioral Sciences,"Linguistics | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language cognition and neuroscience,2327-3798,2327-3801,NA,0,1,1,0,Audiology & Speech-Language Pathology | Behavioral Sciences,"Linguistics | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language culture and curriculum,0790-8318,1747-7573,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language culture and curriculum,0790-8318,1747-7573,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language in society,0047-4045,1469-8013,language_in_soc,0,1,0,1,NA,Linguistics | Sociology,NA,CAMBRIDGE UNIV PRESS,2017-10-26 +language learning,0023-8333,1467-9922,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,WILEY,NA +language learning & technology,1094-3501,1094-3501,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,"UNIV HAWAII, NATL FOREIGN LANGUAGE RESOURCE CENTER",NA +language learning and development,1547-5441,1547-3341,NA,1,1,0,0,NA,"Psychology, Development | Linguistics | Psychology, Experimental",Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language learning and development,1547-5441,1547-3341,NA,1,1,0,0,NA,"Psychology, Development | Linguistics | Psychology, Experimental",Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language matters,1022-8195,1753-5395,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language matters,1022-8195,1753-5395,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +language policy,1568-4555,1573-1863,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,SPRINGER,NA +language policy,1568-4555,1573-1863,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,SPRINGER,NA +language problems & language planning,0272-2690,1569-9889,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +language problems & language planning,0272-2690,1569-9889,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +language resources and evaluation,1574-020X,1574-0218,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications",NA,NA,SPRINGER,NA +language sciences,0388-0001,1873-5746,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ELSEVIER SCI LTD,NA +language sciences,0388-0001,1873-5746,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ELSEVIER SCI LTD,NA +language speech and hearing services in schools,0161-1461,1558-9129,NA,0,1,1,0,Audiology & Speech-Language Pathology,Linguistics | Rehabilitation,NA,AMER SPEECH-LANGUAGE-HEARING ASSOC,NA +language speech and hearing services in schools,0161-1461,1558-9129,NA,0,1,1,0,Audiology & Speech-Language Pathology,Linguistics | Rehabilitation,NA,AMER SPEECH-LANGUAGE-HEARING ASSOC,NA +language teaching,0261-4448,1475-3049,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +language teaching,0261-4448,1475-3049,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +language teaching research,1362-1688,1477-0954,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,SAGE PUBLICATIONS LTD,NA +language testing,0265-5322,1477-0946,LangTestJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,SAGE PUBLICATIONS LTD,2017-09-20 +language testing,0265-5322,1477-0946,LangTestJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,SAGE PUBLICATIONS LTD,2017-09-20 +language variation and change,0954-3945,1469-8021,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +language variation and change,0954-3945,1469-8021,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +langue francaise,0023-8368,1957-7982,NA,1,0,0,0,NA,NA,Language & Linguistics,LAROUSSE,NA +large animal review,1124-4593,1124-4593,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,SIVAR-SOC ITALIANA VETERINARI ANIMALI REDDITO,NA +laryngo-rhino-otologie,0935-8943,1438-8685,NA,0,0,1,0,Otorhinolaryngology,NA,NA,GEORG THIEME VERLAG KG,NA +laryngoscope,0023-852X,1531-4995,NA,0,0,1,0,"Medicine, Research & Experimental | Otorhinolaryngology",NA,NA,WILEY,NA +laryngoscope investigative otolaryngology,2378-8038,2378-8038,NA,0,0,1,0,Otorhinolaryngology,NA,NA,WILEY,NA +laser & photonics reviews,1863-8880,1863-8899,NA,0,0,1,0,"Optics | Physics, Applied | Physics, Condensed Matter",NA,NA,WILEY-V C H VERLAG GMBH,NA +laser and particle beams,0263-0346,1469-803X,and_beams,0,0,1,1,"Physics, Applied",NA,NA,HINDAWI LTD,NA +laser focus world,1043-8092,1043-8092,LaserFocusWorld,0,0,1,1,Optics,NA,NA,PENNWELL PUBL CO,2009-01-15 +laser physics,1054-660X,1555-6611,NA,0,0,1,0,"Optics | Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +laser physics letters,1612-2011,1612-202X,NA,0,0,1,0,"Optics | Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +lasers in engineering,0898-1507,1029-029X,NA,0,0,1,0,"Materials Science, Multidisciplinary | Optics",NA,NA,OLD CITY PUBLISHING INC,NA +lasers in medical science,0268-8921,1435-604X,NA,0,0,1,0,"Engineering, Biomedical | Surgery",NA,NA,SPRINGER LONDON LTD,NA +lasers in surgery and medicine,0196-8092,1096-9101,NA,0,0,1,0,Dermatology | Surgery,NA,NA,WILEY,NA +late imperial china,0884-3236,1086-3257,NA,1,0,0,0,NA,NA,History,JOHNS HOPKINS UNIV PRESS,NA +laterality,1357-650X,1464-0678,NA,0,1,0,0,NA,"Psychology, Multidisciplinary | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +latin american antiquity,1045-6635,2325-5080,NA,1,1,0,0,NA,Anthropology,Archaeology,CAMBRIDGE UNIV PRESS,NA +latin american antiquity,1045-6635,2325-5080,NA,1,1,0,0,NA,Anthropology,Archaeology,CAMBRIDGE UNIV PRESS,NA +latin american applied research,0327-0793,1851-8796,AppliedLatin,0,0,1,1,"Engineering, Chemical",NA,NA,PLAPIQUI(UNS-CONICET),2019-09-29 +latin american economic review,2198-3526,2196-436X,latin_aer,0,1,0,1,NA,Economics,NA,CENTRO INVESTIGACION & DOCENCIA ECONOMICAS-CIDE,2020-03-06 +latin american journal of aquatic research,0718-560X,0717-7178,RevistaLajar,0,0,1,1,Fisheries | Marine & Freshwater Biology,NA,NA,UNIV CATOLICA DE VALPARAISO,2021-03-12 +latin american journal of pharmacy,0326-2383,2362-3853,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,COLEGIO FARMACEUTICOS PROVINCIA DE BUENOS AIRES,NA +latin american journal of solids and structures,1679-7825,1679-7825,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical | Mechanics",NA,NA,LATIN AMER J SOLIDS STRUCTURES,NA +latin american music review-revista de musica latinoamericana,0163-0350,1536-0199,NA,1,0,0,0,NA,NA,Music,UNIV TEXAS PRESS,NA +latin american perspectives,0094-582X,1552-678X,laperspectives,0,1,0,1,NA,Area Studies | Political Science,NA,SAGE PUBLICATIONS INC,2010-04-29 +latin american politics and society,1531-426X,1548-2456,lapsjournal,0,1,0,1,NA,Area Studies | International Relations | Political Science,NA,CAMBRIDGE UNIV PRESS,2018-09-20 +latin american research review,0023-8791,1542-4278,larrlasa,0,1,0,1,NA,Area Studies,NA,LATIN AMER STUDIES ASSOC,2015-11-22 +latin american theatre review,0023-8813,2161-0576,NA,1,0,0,0,NA,NA,Theater,UNIV KANSAS,NA +latomus,0023-8856,2294-4427,NA,1,0,0,0,NA,NA,Classics,PEETERS,NA +laval theologique et philosophique,0023-9054,1703-8804,NA,1,0,0,0,NA,NA,Philosophy | Religion,UNIV LAVAL,NA +law & literature,1535-685X,1541-2601,NA,1,0,0,0,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +law & policy,0265-8240,1467-9930,NA,0,1,0,0,NA,Law,NA,WILEY,NA +law & society review,0023-9216,1540-5893,NA,0,1,0,0,NA,Law | Sociology,NA,WILEY,NA +law and history review,0738-2480,1939-9022,history_law,1,1,0,1,NA,History | History Of Social Sciences | Law,History,CAMBRIDGE UNIV PRESS,2017-10-02 +law and history review,0738-2480,1939-9022,history_law,1,1,0,1,NA,History | History Of Social Sciences | Law,History,CAMBRIDGE UNIV PRESS,2017-10-02 +law and human behavior,0147-7307,1573-661X,lhb_apls,0,1,0,1,NA,"Law | Psychology, Social",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,2020-09-25 +law and philosophy,0167-5249,1573-0522,NA,0,1,0,0,NA,Ethics | Law,NA,SPRINGER,NA +law and social inquiry-journal of the american bar foundation,0897-6546,1747-4469,NA,0,1,0,0,NA,Law,NA,CAMBRIDGE UNIV PRESS,NA +law library journal,0023-9283,0023-9283,NA,0,1,0,0,NA,Information Science & Library Science | Law,NA,AMER ASSOC LAW LIBRARIES,NA +law probability & risk,1470-8396,1470-840X,NA,0,1,1,0,Mathematics | Statistics & Probability,"Law | Social Sciences, Mathematical Methods",NA,OXFORD UNIV PRESS,NA +law probability & risk,1470-8396,1470-840X,NA,0,1,1,0,Mathematics | Statistics & Probability,"Law | Social Sciences, Mathematical Methods",NA,OXFORD UNIV PRESS,NA +lc gc europe,1471-6577,1471-6577,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,ADVANSTAR COMMUNICATIONS INC,NA +lc gc north america,1527-5949,1939-1889,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,ADVANSTAR COMMUNICATIONS INC,NA +leadership,1742-7150,1742-7169,NA,0,1,0,0,NA,Management,NA,SAGE PUBLICATIONS INC,NA +leadership & organization development journal,0143-7739,1472-5347,NA,0,1,0,0,NA,Management,NA,EMERALD GROUP PUBLISHING LTD,NA +leadership quarterly,1048-9843,1873-3409,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,ELSEVIER SCIENCE INC,NA +learned publishing,0953-1513,1741-4857,LearnedPublish,0,1,0,1,NA,Information Science & Library Science,NA,WILEY,2014-12-03 +learning & behavior,1543-4494,1543-4508,NA,0,1,1,0,Behavioral Sciences | Zoology,"Psychology, Biological | Psychology, Experimental",NA,SPRINGER,NA +learning & behavior,1543-4494,1543-4508,NA,0,1,1,0,Behavioral Sciences | Zoology,"Psychology, Biological | Psychology, Experimental",NA,SPRINGER,NA +learning & memory,1072-0502,1549-5485,NA,0,0,1,0,Neurosciences,NA,NA,"COLD SPRING HARBOR LAB PRESS, PUBLICATIONS DEPT",NA +learning and individual differences,1041-6080,1873-3425,NA,0,1,0,0,NA,"Psychology, Educational",NA,ELSEVIER,NA +learning and instruction,0959-4752,1873-3263,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +learning and motivation,0023-9690,1095-9122,NA,0,1,0,0,NA,"Psychology, Biological | Psychology, Experimental",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +learning culture and social interaction,2210-6561,2210-657X,NA,0,1,0,0,NA,Education & Educational Research,NA,ELSEVIER SCI LTD,NA +learning disabilities research & practice,0938-8982,1540-5826,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,WILEY,NA +learning disability quarterly,0731-9487,2168-376X,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SAGE PUBLICATIONS INC,NA +learning media and technology,1743-9884,1743-9892,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +lecture notes in mathematics,0075-8434,1617-9692,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +legacy,0748-4321,0748-4321,LegacyWmenWrite,1,0,0,1,NA,NA,"Literature, American",UNIV NEBRASKA PRESS,2012-08-16 +legal and criminological psychology,1355-3259,2044-8333,NA,0,1,0,0,NA,"Criminology & Penology | Law | Psychology, Multidisciplinary",NA,WILEY,NA +legal medicine,1344-6223,1873-4162,NA,0,0,1,0,"Medicine, Legal",NA,NA,ELSEVIER IRELAND LTD,NA +legal studies,0261-3875,1748-121X,NA,0,1,0,0,NA,Law,NA,CAMBRIDGE UNIV PRESS,NA +legislative studies quarterly,0362-9805,1939-9162,lsqjournal,0,1,0,1,NA,Political Science,NA,WILEY,2019-03-13 +legume research,0250-5371,0976-0571,NA,0,0,1,0,Agronomy,NA,NA,AGRICULTURAL RESEARCH COMMUNICATION CENTRE,NA +leiden journal of international law,0922-1565,1478-9698,ljil_leiden,0,1,0,1,NA,Law,NA,CAMBRIDGE UNIV PRESS,2013-09-28 +leisure sciences,0149-0400,1521-0588,leisuresciences,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,TAYLOR & FRANCIS INC,2016-02-24 +leisure studies,0261-4367,1466-4496,lsj_official,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-02-27 +leonardo,0024-094X,1530-9282,NA,1,0,0,0,NA,NA,Art,MIT PRESS,NA +leonardo music journal,0961-1215,1531-4812,NA,1,0,0,0,NA,NA,Music,MIT PRESS,NA +leprosy review,0305-7518,2162-8807,LeprosyReview,0,0,1,1,Dermatology | Infectious Diseases | Pathology | Tropical Medicine,NA,NA,LEPRA,2019-07-25 +lethaia,0024-1164,1502-3931,NA,0,0,1,0,Paleontology,NA,NA,WILEY,NA +lettere italiane,0024-1334,2035-6315,NA,1,0,0,0,NA,NA,"Literature, Romance",CASA EDITRICE LEO S OLSCHKI,NA +letters in applied microbiology,0266-8254,1472-765X,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,WILEY,NA +letters in drug design & discovery,1570-1808,1875-628X,NA,0,0,1,0,"Chemistry, Medicinal",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +letters in mathematical physics,0377-9017,1573-0530,NA,0,0,1,0,"Physics, Mathematical",NA,NA,SPRINGER,NA +letters in organic chemistry,1570-1786,1875-6255,NA,0,0,1,0,"Chemistry, Organic",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +leukemia,0887-6924,1476-5551,LeukemiaJnl,0,0,1,1,Oncology | Hematology,NA,NA,SPRINGERNATURE,2011-10-26 +leukemia & lymphoma,1042-8194,1029-2403,NA,0,0,1,0,Oncology | Hematology,NA,NA,TAYLOR & FRANCIS LTD,NA +leukemia research,0145-2126,1873-5835,NA,0,0,1,0,Oncology | Hematology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +leukos,1550-2724,1550-2716,NA,0,0,1,0,Construction & Building Technology | Optics,NA,NA,TAYLOR & FRANCIS INC,NA +levant,0075-8914,1756-3801,JournalLevant,1,0,0,1,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-12-14 +leviathan-a journal of melville studies,1525-6995,1750-1849,uoe_leviathan,1,0,0,1,NA,NA,"Literature, American",JOHNS HOPKINS UNIV PRESS,2021-10-01 +lex localis-journal of local self-government,1581-5374,1855-363X,NA,0,1,0,0,NA,Political Science | Public Administration,NA,INST LOCAL SELF-GOVERNMENT MARIBOR,NA +lexikos,1684-4904,2224-0039,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,BURO VAN DIE WAT,NA +lexikos,1684-4904,2224-0039,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,BURO VAN DIE WAT,NA +lgbt health,2325-8292,2325-8306,LGBTHealthJrnl,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"MARY ANN LIEBERT, INC",2013-03-14 +lgbt health,2325-8292,2325-8306,LGBTHealthJrnl,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"MARY ANN LIEBERT, INC",2013-03-14 +lias-journal of early modern intellectual culture and its sources,2033-4753,2033-5016,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",PEETERS,NA +liberte,0024-2020,NA,RevueLiberte,1,0,0,1,NA,NA,Literary Reviews,LIBERTE,2013-12-19 +library,0024-2160,1744-8581,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",OXFORD UNIV PRESS,NA +library & information science research,0740-8188,1873-1848,NA,0,1,0,0,NA,Information Science & Library Science,NA,ELSEVIER SCIENCE INC,NA +library and information science,0373-4447,0373-4447,NA,0,1,0,0,NA,Information Science & Library Science,NA,MITA SOC LIBRARY INFORMATION SCIENCE,NA +library collections acquisitions & technical services,1464-9055,1873-1821,NA,0,1,0,0,NA,Information Science & Library Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +library hi tech,0737-8831,0737-8831,NA,0,1,0,0,NA,Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +library journal,0363-0277,NA,LibraryJournal,0,1,0,1,NA,Information Science & Library Science,NA,REED BUSINESS INFORMATION,2008-06-19 +library quarterly,0024-2519,1549-652X,NA,0,1,0,0,NA,Information Science & Library Science,NA,UNIV CHICAGO PRESS,NA +library resources & technical services,0024-2527,2159-9610,NA,0,1,0,0,NA,Information Science & Library Science,NA,AMER LIBRARY ASSOC,NA +library trends,0024-2594,1559-0682,NA,0,1,0,0,NA,Information Science & Library Science,NA,JOHNS HOPKINS UNIV PRESS,NA +libri-international journal of libraries and information studies,0024-2667,1865-8423,Journal_LIBRI,0,1,0,1,NA,Information Science & Library Science,NA,WALTER DE GRUYTER GMBH,2018-03-12 +libyan journal of medicine,1993-2820,1819-6357,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,TAYLOR & FRANCIS LTD,NA +lichenologist,0024-2829,1096-1135,T_Lichenologist,0,0,1,1,Plant Sciences | Mycology,NA,NA,CAMBRIDGE UNIV PRESS,2021-03-10 +lied und populare kultur-song and popular culture,1619-0548,1619-0548,NA,1,0,0,0,NA,NA,Folklore | Music,WAXMANN VERLAG GMBH,NA +life-basel,2075-1729,2075-1729,Life_MDPI,0,0,1,1,Biology,NA,NA,MDPI,2016-06-02 +life science alliance,2575-1077,2575-1077,LSAjournal,0,0,1,1,Biology,NA,NA,LIFE SCIENCE ALLIANCE LLC,2017-09-13 +life sciences,0024-3205,1879-0631,NA,0,0,1,0,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +life sciences in space research,2214-5524,2214-5532,NA,0,0,1,0,Astronomy & Astrophysics | Biology,NA,NA,ELSEVIER,NA +life writing,1448-4528,1751-2964,LifeWritingJnl,1,0,0,1,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-05-09 +lifestyle genomics,2504-3161,2504-3188,NA,0,0,1,0,Genetics & Heredity | Nutrition & Dietetics,NA,NA,KARGER,NA +lifetime data analysis,1380-7870,1572-9249,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability",NA,NA,SPRINGER,NA +light-science & applications,2047-7538,2047-7538,LightSciAppl,0,0,1,1,Optics,NA,NA,SPRINGERNATURE,2014-05-19 +light & engineering,0236-2945,2541-9935,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics",NA,NA,ZNACK PUBLISHING HOUSE,NA +lighting research & technology,1477-1535,1477-0938,NA,0,0,1,0,Construction & Building Technology | Optics,NA,NA,SAGE PUBLICATIONS LTD,NA +lili-zeitschrift fur literaturwissenschaft und linguistik,0049-8653,2365-953X,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,J B METZLER,NA +limnetica,0213-8409,1989-1806,NA,0,0,1,0,Limnology | Marine & Freshwater Biology,NA,NA,ASOC ESPAN LIMNOL-MISLATA,NA +limnologica,0075-9511,1873-5851,NA,0,0,1,0,Limnology,NA,NA,ELSEVIER GMBH,NA +limnology,1439-8621,1439-863X,NA,0,0,1,0,Limnology,NA,NA,SPRINGER JAPAN KK,NA +limnology and oceanography,0024-3590,1939-5590,NA,0,0,1,0,Limnology | Oceanography,NA,NA,WILEY,NA +limnology and oceanography-methods,1541-5856,1541-5856,NA,0,0,1,0,Limnology | Oceanography,NA,NA,WILEY,NA +limnology and oceanography letters,2378-2242,2378-2242,NA,0,0,1,0,Limnology | Oceanography,NA,NA,WILEY,NA +linear & multilinear algebra,0308-1087,1563-5139,NA,0,0,1,0,Mathematics,NA,NA,TAYLOR & FRANCIS LTD,NA +linear algebra and its applications,0024-3795,1873-1856,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ELSEVIER SCIENCE INC,NA +lingua,0024-3841,1872-6135,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ELSEVIER,NA +lingua,0024-3841,1872-6135,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ELSEVIER,NA +lingua e stile,0024-385X,0024-385X,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,SOC ED IL MULINO,NA +lingua nostra,0024-3868,NA,NA,1,0,0,0,NA,NA,Language & Linguistics,CASA EDITRICE G C SANSONI SPA,NA +linguistic approaches to bilingualism,1879-9264,1879-9272,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +linguistic approaches to bilingualism,1879-9264,1879-9272,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +linguistic inquiry,0024-3892,1530-9150,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,MIT PRESS,NA +linguistic inquiry,0024-3892,1530-9150,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,MIT PRESS,NA +linguistic review,0167-6318,1613-3676,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +linguistic review,0167-6318,1613-3676,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +linguistic typology,1430-0532,1613-415X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +linguistic typology,1430-0532,1613-415X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +linguistica antverpiensia new series-themes in translation studies,2295-5739,2295-5739,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ACADEMIC & SCIENTIFIC PUBLISHERS-ASP,NA +linguistica antverpiensia new series-themes in translation studies,2295-5739,2295-5739,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,ACADEMIC & SCIENTIFIC PUBLISHERS-ASP,NA +linguistics,0024-3949,1613-396X,LinguisticsJ,1,1,0,1,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,2019-08-28 +linguistics,0024-3949,1613-396X,LinguisticsJ,1,1,0,1,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,2019-08-28 +linguistics and education,0898-5898,1873-1864,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,ELSEVIER,NA +linguistics and education,0898-5898,1873-1864,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,ELSEVIER,NA +linguistics and philosophy,0165-0157,1573-0549,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SPRINGER,NA +linguistics and philosophy,0165-0157,1573-0549,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SPRINGER,NA +linguistics vanguard,2199-174X,2199-174X,LingVanguard,1,1,0,1,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,2015-02-23 +linguistics vanguard,2199-174X,2199-174X,LingVanguard,1,1,0,1,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,2015-02-23 +linguistique,0075-966X,2101-0234,NA,1,0,0,0,NA,NA,Language & Linguistics,PRESSES UNIV FRANCE,NA +lion and the unicorn,0147-2593,1080-6563,NA,1,0,0,0,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,NA +lipids,0024-4201,1558-9307,NA,0,0,1,0,Biochemistry & Molecular Biology | Nutrition & Dietetics,NA,NA,WILEY,NA +lipids in health and disease,1476-511X,1476-511X,NA,0,0,1,0,Biochemistry & Molecular Biology | Nutrition & Dietetics,NA,NA,BMC,NA +liquid crystals,0267-8292,1366-5855,NA,0,0,1,0,"Chemistry, Multidisciplinary | Crystallography | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +liquid crystals reviews,2168-0396,2168-0418,NA,0,0,1,0,"Chemistry, Physical | Crystallography | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +listy cukrovarnicke a reparske,1210-3306,1805-9708,NA,0,0,1,0,Food Science & Technology,NA,NA,LISTY CUKROVARNICKE REPARSKE,NA +listy filologicke,0024-4457,2570-9410,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",INST CLASSICAL STUD ACAD SCI CZECH REPUBLIC,NA +lit-literature interpretation theory,1043-6928,1545-5866,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +literacy,1741-4350,1741-4369,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,WILEY,NA +literacy,1741-4350,1741-4369,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,WILEY,NA +literary imagination,1523-9012,1752-6566,literaryimag,1,0,0,1,NA,NA,Literary Reviews,OXFORD UNIV PRESS,2017-01-09 +literary review,0024-4589,NA,TLR_tweets,1,0,0,1,NA,NA,Literary Reviews,FAIRLEIGH DICKINSON UNIV LITERARY REV,2012-01-20 +literatur und kritik,0024-466X,NA,NA,1,0,0,0,NA,NA,Literary Reviews,OTTO MULLER VERLAG,NA +literature & history-third series,0306-1973,2050-4594,NA,1,0,0,0,NA,NA,History | Literature,SAGE PUBLICATIONS LTD,NA +literature and medicine,0278-9671,1080-6571,literature_med,1,0,0,1,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,2020-07-19 +literature and theology,0269-1205,1477-4623,NA,1,0,0,0,NA,NA,Religion | Literary Theory & Criticism,OXFORD UNIV PRESS,NA +literature compass,1741-4113,1741-4113,NA,1,0,0,0,NA,NA,Literature,WILEY,NA +lithic technology,0197-7261,2051-6185,NA,1,1,0,0,NA,Anthropology,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +lithic technology,0197-7261,2051-6185,NA,1,1,0,0,NA,Anthropology,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +lithology and mineral resources,0024-4902,1608-3229,NA,0,0,1,0,Geochemistry & Geophysics | Geology | Mineralogy,NA,NA,PLEIADES PUBLISHING INC,NA +lithos,0024-4937,1872-6143,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,ELSEVIER,NA +lithosphere,1941-8264,1947-4253,LithosphereGSW,0,0,1,1,Geochemistry & Geophysics | Geology,NA,NA,GEOSCIENCEWORLD,2019-12-07 +lithuanian journal of physics,1648-8504,1648-8504,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,LITHUANIAN PHYSICAL SOC,NA +lithuanian mathematical journal,0363-1672,1573-8825,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +litterature,0047-4800,1958-5926,NA,1,0,0,0,NA,NA,Literature,LAROUSSE,NA +litteratures,0563-9751,2273-0311,NA,1,0,0,0,NA,NA,Literature,UNIV TOULOUSE MIRAIL,NA +liver cancer,2235-1795,1664-5553,NA,0,0,1,0,Oncology | Gastroenterology & Hepatology,NA,NA,KARGER,NA +liver international,1478-3223,1478-3231,LiverInt,0,0,1,1,Gastroenterology & Hepatology,NA,NA,WILEY,2012-11-20 +liver transplantation,1527-6465,1527-6473,LTxJournal,0,0,1,1,Gastroenterology & Hepatology | Surgery | Transplantation,NA,NA,WILEY,2016-10-12 +livestock science,1871-1413,1878-0490,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,ELSEVIER,NA +living reviews in relativity,2367-3613,1433-8351,NA,0,0,1,0,"Physics, Particles & Fields",NA,NA,SPRINGER INT PUBL AG,NA +living reviews in solar physics,2367-3648,1614-4961,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,SPRINGER INT PUBL AG,NA +ljetopis socijalnog rada,1846-5412,1846-5412,asw_ljsr,0,1,0,1,NA,Social Work,NA,UNIV ZAGREB FAC LAW DEPT SOCIAL WORK,2020-04-20 +local environment,1354-9839,1469-6711,NA,0,1,0,0,NA,Green & Sustainable Science & Technology | Environmental Studies | Geography | Regional & Urban Planning | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +local government studies,0300-3930,1743-9388,lgstudies,0,1,0,1,NA,Regional & Urban Planning | Political Science | Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-10-04 +logic journal of the igpl,1367-0751,1368-9894,NA,0,0,1,0,"Mathematics, Applied | Mathematics | Logic",NA,NA,OXFORD UNIV PRESS,NA +logica universalis,1661-8297,1661-8300,NA,0,0,1,0,Logic,NA,NA,SPRINGER BASEL AG,NA +logical methods in computer science,1860-5974,1860-5974,NA,0,0,1,0,"Computer Science, Theory & Methods | Logic",NA,NA,LOGICAL METHODS COMPUTER SCIENCE E V,NA +logique et analyse,0024-5836,2295-5836,NA,1,0,0,0,NA,NA,Philosophy,PEETERS,NA +logopedics phoniatrics vocology,1401-5439,1651-2022,NA,0,0,1,0,Audiology & Speech-Language Pathology | Otorhinolaryngology,NA,NA,TAYLOR & FRANCIS LTD,NA +logos-a journal of catholic thought and culture,1091-6687,1533-791X,NA,1,0,0,0,NA,NA,Religion,"UNIV ST THOMAS, CTR CATHOLIC STUDIES",NA +logos-vilnius,0868-7692,NA,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",LOGOS,NA +logos & pneuma-chinese journal of theology,1023-2583,NA,NA,1,0,0,0,NA,NA,Religion,LOGOS & PNEUMA PRESS,NA +london journal,0305-8034,1749-6322,lonjournal,1,1,0,1,NA,History | Area Studies,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-02-27 +london journal,0305-8034,1749-6322,lonjournal,1,1,0,1,NA,History | Area Studies,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-02-27 +long range planning,0024-6301,1873-1872,NA,0,1,0,0,NA,Business | Development Studies | Management,NA,ELSEVIER SCI LTD,NA +longitudinal and life course studies,1757-9597,1757-9597,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Social Sciences, Interdisciplinary",NA,BRISTOL UNIV PRESS & POLICY PRESS,NA +lotus international,1124-9064,NA,NA,1,0,0,0,NA,NA,Architecture,EDITORIALE LOTUS,NA +low temperature physics,1063-777X,1090-6517,NA,0,0,1,0,"Physics, Applied",NA,NA,AIP PUBLISHING,NA +lubricants,2075-4442,2075-4442,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,MDPI,NA +lubrication science,0954-0075,1557-6833,NA,0,0,1,0,"Engineering, Chemical | Engineering, Mechanical",NA,NA,WILEY,NA +luminescence,1522-7235,1522-7243,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,WILEY,NA +lung,0341-2040,1432-1750,NA,0,0,1,0,Respiratory System,NA,NA,SPRINGER,NA +lung cancer,0169-5002,1872-8332,LungCaJournal,0,0,1,1,Oncology | Respiratory System,NA,NA,ELSEVIER IRELAND LTD,2021-02-01 +lupus,0961-2033,1477-0962,NA,0,0,1,0,Rheumatology,NA,NA,SAGE PUBLICATIONS LTD,NA +lupus science & medicine,2053-8790,2053-8790,Lupus_SM,0,0,1,1,Rheumatology,NA,NA,BMJ PUBLISHING GROUP,2014-12-16 +luso-brazilian review,0024-7413,1548-9957,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV WISCONSIN PRESS,NA +luts-lower urinary tract symptoms,1757-5664,1757-5672,NA,0,0,1,0,Urology & Nephrology,NA,NA,WILEY,NA +lwt-food science and technology,0023-6438,1096-1127,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER,NA +lymphatic research and biology,1539-6851,1557-8585,NA,0,0,1,0,"Medicine, Research & Experimental | Physiology",NA,NA,"MARY ANN LIEBERT, INC",NA +lymphology,0024-7766,2522-7963,NA,0,0,1,0,Immunology | Physiology,NA,NA,LYMPHOLOGY,NA +m s-medecine sciences,0767-0974,1958-5381,ms_MedSci,0,0,1,1,"Medicine, Research & Experimental",NA,NA,EDP SCIENCES S A,2013-01-31 +m&som-manufacturing & service operations management,1523-4614,1526-5498,NA,0,1,1,0,Operations Research & Management Science,Management,NA,INFORMS,NA +m&som-manufacturing & service operations management,1523-4614,1526-5498,NA,0,1,1,0,Operations Research & Management Science,Management,NA,INFORMS,NA +mabs,1942-0862,1942-0870,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,TAYLOR & FRANCIS INC,NA +macedonian journal of chemistry and chemical engineering,1857-5552,1857-5625,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,SOC CHEMISTS TECHNOLOGISTS MADECONIA,NA +machine learning,0885-6125,1573-0565,MLJ_Social,0,0,1,1,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER,2020-11-13 +machine vision and applications,0932-8092,1432-1769,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Cybernetics | Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +machines,2075-1702,2075-1702,Machines_MDPI,0,0,1,1,"Engineering, Electrical & Electronic | Engineering, Mechanical",NA,NA,MDPI,2018-01-22 +machining science and technology,1091-0344,1532-2483,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS INC,NA +macroeconomic dynamics,1365-1005,1469-8056,NA,0,1,0,0,NA,Economics,NA,CAMBRIDGE UNIV PRESS,NA +macroheterocycles,1998-9539,1998-9539,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,IVANOVO STATE UNIV CHEMICAL TECHNOLOGY,NA +macromolecular bioscience,1616-5187,1616-5195,NA,0,0,1,0,"Biochemistry & Molecular Biology | Materials Science, Biomaterials | Polymer Science",NA,NA,WILEY-V C H VERLAG GMBH,NA +macromolecular chemistry and physics,1022-1352,1521-3935,NA,0,0,1,0,Polymer Science,NA,NA,WILEY-V C H VERLAG GMBH,NA +macromolecular materials and engineering,1438-7492,1439-2054,NA,0,0,1,0,"Materials Science, Multidisciplinary | Polymer Science",NA,NA,WILEY-V C H VERLAG GMBH,NA +macromolecular rapid communications,1022-1336,1521-3927,NA,0,0,1,0,Polymer Science,NA,NA,WILEY-V C H VERLAG GMBH,NA +macromolecular reaction engineering,1862-832X,1862-8338,NA,0,0,1,0,"Engineering, Chemical | Polymer Science",NA,NA,WILEY-V C H VERLAG GMBH,NA +macromolecular research,1598-5032,2092-7673,NA,0,0,1,0,Polymer Science,NA,NA,POLYMER SOC KOREA,NA +macromolecular theory and simulations,1022-1344,1521-3919,NA,0,0,1,0,Polymer Science,NA,NA,WILEY-V C H VERLAG GMBH,NA +macromolecules,0024-9297,1520-5835,NA,0,0,1,0,Polymer Science,NA,NA,AMER CHEMICAL SOC,NA +madera y bosques,2448-7597,2448-7597,MaderayBosques,0,0,1,1,Forestry,NA,NA,INST ECOLOGIA A C,2017-06-19 +maderas-ciencia y tecnologia,0717-3644,0718-221X,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,UNIV BIO-BIO,NA +maejo international journal of science and technology,1905-7873,NA,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,MAEJO UNIV,NA +magallania,0718-2244,0718-2244,NA,0,1,0,0,NA,Anthropology,NA,UNIV MAGALLANES,NA +magazine antiques,0161-9284,NA,AntiquesMag,1,0,0,1,NA,NA,Art,"BRANT PUBL, INC",2011-06-14 +magazine of concrete research,0024-9831,1751-763X,NA,0,0,1,0,"Construction & Building Technology | Materials Science, Multidisciplinary",NA,NA,ICE PUBLISHING,NA +magic ritual and witchcraft,1556-8547,1940-5111,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV PENNSYLVANIA PRESS,NA +magnesium research,0953-1424,1952-4021,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,JOHN LIBBEY EUROTEXT LTD,NA +magnetic resonance imaging,0730-725X,1873-5894,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,NA +magnetic resonance imaging clinics of north america,1064-9689,1557-9786,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +magnetic resonance in chemistry,0749-1581,1097-458X,MagnResonChem,0,0,1,1,"Chemistry, Multidisciplinary | Chemistry, Physical | Spectroscopy",NA,NA,WILEY,2015-12-02 +magnetic resonance in medical sciences,1347-3182,1880-2206,in_magnetic,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,JPN SOC MAGNETIC RESONANCE MEDICINE,2020-02-27 +magnetic resonance in medicine,0740-3194,1522-2594,MagResMed,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,2009-04-26 +magnetic resonance materials in physics biology and medicine,0968-5243,1352-8661,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +magnetochemistry,2312-7481,2312-7481,Magnetochem,0,0,1,1,"Chemistry, Inorganic & Nuclear | Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,MDPI,2018-01-26 +magnetohydrodynamics,0024-998X,1574-0579,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,UNIV LATVIA INST PHYSICS,NA +magyar allatorvosok lapja,0025-004X,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,MEZOGAZDA KIADO KFT,NA +maia-rivista di letterature classiche,0025-0538,NA,NA,1,0,0,0,NA,NA,Classics,CAPPELLI EDITORE,NA +main group chemistry,1024-1221,1745-1167,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,IOS PRESS,NA +main group metal chemistry,0792-1241,2191-0219,MGMC_DG,0,0,1,1,"Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,WALTER DE GRUYTER GMBH,2021-04-14 +malacologia,0076-2997,2168-9075,NA,0,0,1,0,Zoology,NA,NA,INST MALACOL,NA +malaria journal,1475-2875,1475-2875,MalariaJournal,0,0,1,1,Infectious Diseases | Parasitology | Tropical Medicine,NA,NA,BMC,2013-04-18 +malawi medical journal,1995-7262,1995-7270,MalawiMedJ,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,MED COLL MALAWI,2016-09-10 +malaysian journal of computer science,0127-9084,0127-9084,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,"UNIV MALAYA, FAC COMPUTER SCIENCE & INFORMATION TECH",NA +malaysian journal of library & information science,1394-6234,1394-6234,MJLIS_um,0,1,0,1,NA,Information Science & Library Science,NA,"UNIV MALAYA, FAC COMPUTER SCIENCE & INFORMATION TECH",2017-11-22 +malaysian journal of pathology,0126-8635,0126-8635,NA,0,0,1,0,Pathology,NA,NA,MALAYSIAN JOURNAL PATHOLOGY,NA +malimbus,0331-3689,NA,NA,0,0,1,0,Ornithology,NA,NA,WEST AFRICAN ORNITHOLOGICAL SOC,NA +mammal research,2199-2401,2199-241X,MammRes,0,0,1,1,Zoology,NA,NA,SPRINGER HEIDELBERG,2014-10-28 +mammal review,0305-1838,1365-2907,NA,0,0,1,0,Ecology | Zoology,NA,NA,WILEY,NA +mammal study,1343-4152,1348-6160,MammalStudy,0,0,1,1,Zoology,NA,NA,MAMMALOGICAL SOC JAPAN,2018-09-12 +mammalia,0025-1461,1864-1547,NA,0,0,1,0,Zoology,NA,NA,WALTER DE GRUYTER GMBH,NA +mammalian biology,1616-5047,1618-1476,NA,0,0,1,0,Zoology,NA,NA,SPRINGER HEIDELBERG,NA +mammalian genome,0938-8990,1432-1777,NA,0,0,1,0,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,SPRINGER,NA +management & organizational history,1744-9359,1744-9367,NA,0,1,0,0,NA,History | History Of Social Sciences | Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +management accounting research,1044-5005,1096-1224,NA,0,1,0,0,NA,"Business, Finance | Management",NA,ELSEVIER,NA +management and organization review,1740-8776,1740-8784,NA,0,1,0,0,NA,Management,NA,CAMBRIDGE UNIV PRESS,NA +management communication quarterly,0893-3189,1552-6798,NA,0,1,0,0,NA,Communication | Management,NA,SAGE PUBLICATIONS INC,NA +management decision,0025-1747,1758-6070,mgt_decision,0,1,0,1,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,2016-01-28 +management international review,0938-8249,1861-8901,NA,0,1,0,0,NA,Management,NA,SPRINGER HEIDELBERG,NA +management learning,1350-5076,1461-7307,mgmt_learning,0,1,0,1,NA,Management,NA,SAGE PUBLICATIONS LTD,2014-10-02 +management of biological invasions,1989-8649,1989-8649,NA,0,0,1,0,Biodiversity Conservation,NA,NA,REGIONAL EURO-ASIAN BIOLOGICAL INVASIONS CENTRE-REABIC,NA +management science,0025-1909,1526-5501,NA,0,1,1,0,Operations Research & Management Science,Management,NA,INFORMS,NA +management science,0025-1909,1526-5501,NA,0,1,1,0,Operations Research & Management Science,Management,NA,INFORMS,NA +managerial and decision economics,0143-6570,1099-1468,NA,0,1,0,0,NA,Economics | Management,NA,JOHN WILEY & SONS LTD,NA +managerial auditing journal,0268-6902,1758-7735,NA,0,1,0,0,NA,"Business, Finance | Management",NA,EMERALD GROUP PUBLISHING LTD,NA +manchester school,1463-6786,1467-9957,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +manufacturing engineering,0361-0853,0361-0853,NA,0,0,1,0,"Engineering, Manufacturing",NA,NA,SOC MANUFACTURING ENGINEERS,NA +manuscripta mathematica,0025-2611,1432-1785,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +manuscrito,0100-6045,2317-630X,NA,1,0,0,0,NA,NA,Philosophy,"UNICAMP-UNIV ESTADUAL CAMPINAS, CTRO LOGICA EPISTEMOLOGIA HIST CIENCIA",NA +mapan-journal of metrology society of india,0970-3950,0974-9853,NA,0,0,1,0,"Instruments & Instrumentation | Physics, Applied",NA,NA,METROLOGY SOC INDIA,NA +marg-a magazine of the arts,0972-1444,NA,NA,1,0,0,0,NA,NA,Art | Asian Studies,MARG FOUNDATION,NA +marine and coastal fisheries,1942-5120,1942-5120,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,WILEY,NA +marine and freshwater behaviour and physiology,1023-6244,1029-0362,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +marine and freshwater research,1323-1650,1448-6059,NA,0,0,1,0,Fisheries | Limnology | Marine & Freshwater Biology | Oceanography,NA,NA,CSIRO PUBLISHING,NA +marine and petroleum geology,0264-8172,1873-4073,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +marine biodiversity,1867-1616,1867-1624,NA,0,0,1,0,Biodiversity Conservation | Marine & Freshwater Biology,NA,NA,SPRINGER HEIDELBERG,NA +marine biology,0025-3162,1432-1793,Mar_Biology,0,0,1,1,Marine & Freshwater Biology,NA,NA,SPRINGER HEIDELBERG,2015-03-02 +marine biology research,1745-1000,1745-1019,NA,0,0,1,0,Ecology | Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS AS,NA +marine biotechnology,1436-2228,1436-2236,NA,0,0,1,0,Biotechnology & Applied Microbiology | Marine & Freshwater Biology,NA,NA,SPRINGER,NA +marine chemistry,0304-4203,1872-7581,NA,0,0,1,0,"Chemistry, Multidisciplinary | Oceanography",NA,NA,ELSEVIER,NA +marine drugs,1660-3397,1660-3397,Marine_Drugs,0,0,1,1,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,MDPI,2015-09-11 +marine ecology-an evolutionary perspective,0173-9565,1439-0485,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,WILEY,NA +marine ecology progress series,0171-8630,1616-1599,MEPS_IR,0,0,1,1,Ecology | Marine & Freshwater Biology | Oceanography,NA,NA,INTER-RESEARCH,2016-06-28 +marine environmental research,0141-1136,1879-0291,NA,0,0,1,0,Environmental Sciences | Marine & Freshwater Biology | Toxicology,NA,NA,ELSEVIER SCI LTD,NA +marine genomics,1874-7787,1876-7478,NA,0,0,1,0,Genetics & Heredity,NA,NA,ELSEVIER,NA +marine geodesy,0149-0419,1521-060X,NA,0,0,1,0,Geochemistry & Geophysics | Oceanography | Remote Sensing,NA,NA,TAYLOR & FRANCIS INC,NA +marine geology,0025-3227,1872-6151,NA,0,0,1,0,"Geosciences, Multidisciplinary | Oceanography",NA,NA,ELSEVIER,NA +marine geophysical research,0025-3235,1573-0581,NA,0,0,1,0,Geochemistry & Geophysics | Oceanography,NA,NA,SPRINGER,NA +marine georesources & geotechnology,1064-119X,1521-0618,NA,0,0,1,0,"Engineering, Ocean | Engineering, Geological | Oceanography | Mining & Mineral Processing",NA,NA,TAYLOR & FRANCIS INC,NA +marine mammal science,0824-0469,1748-7692,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,WILEY,NA +marine micropaleontology,0377-8398,1872-6186,NA,0,0,1,0,Paleontology,NA,NA,ELSEVIER,NA +marine ornithology,1018-3337,2074-1235,MarineOrno,0,0,1,1,Ornithology,NA,NA,AFRICAN SEABIRD GROUP,2016-05-05 +marine policy,0308-597X,1872-9460,policymarine,0,1,0,1,NA,Environmental Studies | International Relations,NA,ELSEVIER SCI LTD,2020-12-19 +marine pollution bulletin,0025-326X,1879-3363,NA,0,0,1,0,Environmental Sciences | Marine & Freshwater Biology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +marine resource economics,0738-1360,2334-5985,MarineResource,0,1,1,1,Fisheries,Economics | Environmental Studies,NA,UNIV CHICAGO PRESS,NA +marine resource economics,0738-1360,2334-5985,MarineResource,0,1,1,1,Fisheries,Economics | Environmental Studies,NA,UNIV CHICAGO PRESS,NA +marine structures,0951-8339,1873-4170,NA,0,0,1,0,"Engineering, Marine | Engineering, Civil",NA,NA,ELSEVIER SCI LTD,NA +marine technology society journal,0025-3324,1948-1209,NA,0,0,1,0,"Engineering, Ocean | Oceanography",NA,NA,MARINE TECHNOLOGY SOC INC,NA +mariners mirror,0025-3359,2049-680X,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +maritime economics & logistics,1479-2931,1479-294X,NA,0,1,0,0,NA,Transportation,NA,PALGRAVE MACMILLAN LTD,NA +maritime policy & management,0308-8839,1464-5254,NA,0,1,0,0,NA,Transportation,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +marketing intelligence & planning,0263-4503,1758-8049,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +marketing letters,0923-0645,1573-059X,NA,0,1,0,0,NA,Business,NA,SPRINGER,NA +marketing science,0732-2399,1526-548X,MarketngScience,0,1,0,1,NA,Business,NA,INFORMS,2010-10-20 +marketing theory,1470-5931,1741-301X,MktgTheory_news,0,1,0,1,NA,Business,NA,SAGE PUBLICATIONS INC,2019-01-07 +markov processes and related fields,1024-2953,1024-2953,NA,0,0,1,0,Statistics & Probability,NA,NA,POLYMAT,NA +marvels & tales-journal of fairy-tale studies,1521-4281,1536-1802,NA,1,0,0,0,NA,NA,Folklore | Literature,WAYNE STATE UNIV PRESS,NA +mass communication and society,1520-5436,1532-7825,masscomm_soc,0,1,0,1,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-01-17 +mass spectrometry reviews,0277-7037,1098-2787,NA,0,0,1,0,Spectroscopy,NA,NA,WILEY,NA +massachusetts review,0025-4878,2330-0485,MassReview,1,0,0,1,NA,NA,Literary Reviews,UNIV MASSACHUSETTS MASSACHUSETTS REVIEW,2013-10-10 +master drawings,0025-5025,NA,NA,1,0,0,0,NA,NA,Art,MASTER DRAWINGS ASSOC INC,NA +match-communications in mathematical and in computer chemistry,0340-6253,NA,NA,0,0,1,0,"Chemistry, Multidisciplinary | Computer Science, Interdisciplinary Applications | Mathematics, Interdisciplinary Applications",NA,NA,"UNIV KRAGUJEVAC, FAC SCIENCE",NA +materia-rio de janeiro,1517-7076,1517-7076,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,"UNIV FED RIO DE JANEIRO, LAB HIDROGENIO",NA +material religion,1743-2200,1751-8342,MaterialReligi1,1,0,0,1,NA,NA,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-09-16 +materiale plastice,2668-8220,0025-5289,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,REVISTA CHIMIE SRL,NA +materiales de construccion,0465-2746,1988-3226,MaterialesdeCo3,0,0,1,1,"Construction & Building Technology | Materials Science, Multidisciplinary",NA,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,2021-04-13 +materiali e discussioni per l analisi dei testi classici,0392-6338,1724-1693,NA,1,0,0,0,NA,NA,Classics,FABRIZIO SERRA EDITORE,NA +materiali in tehnologije,1580-2949,1580-3414,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,INST ZA KOVINSKE MATERIALE I IN TEHNOLOGIE,NA +materials,1996-1944,1996-1944,Materials_mdpi,0,0,1,1,"Chemistry, Physical | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering | Physics, Applied | Physics, Condensed Matter",NA,NA,MDPI,2015-09-16 +materials & design,0264-1275,1873-4197,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +materials and corrosion-werkstoffe und korrosion,0947-5117,1521-4176,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,WILEY-V C H VERLAG GMBH,NA +materials and manufacturing processes,1042-6914,1532-2475,NA,0,0,1,0,"Engineering, Manufacturing | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS INC,NA +materials and structures,1359-5997,1871-6873,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +materials at high temperatures,0960-3409,1878-6413,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,TAYLOR & FRANCIS LTD,NA +materials characterization,1044-5803,1873-4189,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering | Materials Science, Characterization, Testing",NA,NA,ELSEVIER SCIENCE INC,NA +materials chemistry and physics,0254-0584,1879-3312,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCIENCE SA,NA +materials chemistry frontiers,2052-1537,2052-1537,NA,0,0,1,0,"Chemistry, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,NA +materials evaluation,0025-5327,0025-5327,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,AMER SOC NONDESTRUCTIVE TEST,NA +materials express,2158-5849,2158-5857,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,AMER SCIENTIFIC PUBLISHERS,NA +materials horizons,2051-6347,2051-6355,MaterHoriz,0,0,1,1,"Chemistry, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,2013-01-29 +materials letters,0167-577X,1873-4979,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER,NA +materials performance,0094-1492,0094-1492,MPcorrosion,0,0,1,1,"Materials Science, Characterization, Testing",NA,NA,"NATL ASSOC CORROSION ENG",2015-06-12 +materials research-ibero-american journal of materials,1516-1439,1980-5373,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,"UNIV FED SAO CARLOS, DEPT ENGENHARIA MATERIALS",NA +materials research bulletin,0025-5408,1873-4227,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +materials research express,2053-1591,2053-1591,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +materials research letters,2166-3831,2166-3831,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS INC,NA +materials science,1068-820X,1573-885X,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +materials science-medziagotyra,1392-1320,2029-7289,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,KAUNAS UNIV TECH,NA +materials science-poland,2083-134X,2083-134X,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,SCIENDO,NA +materials science & engineering c-materials for biological applications,0928-4931,1873-0191,NA,0,0,1,0,"Materials Science, Biomaterials",NA,NA,ELSEVIER,NA +materials science & engineering r-reports,0927-796X,1879-212X,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER SCIENCE SA,NA +materials science and engineering a-structural materials properties microstructure and processing,0921-5093,1873-4936,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,ELSEVIER SCIENCE SA,NA +materials science and engineering b-advanced functional solid-state materials,0921-5107,1873-4944,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +materials science and technology,0267-0836,1743-2847,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,TAYLOR & FRANCIS LTD,NA +materials science in semiconductor processing,1369-8001,1873-4081,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,ELSEVIER SCI LTD,NA +materials technology,1066-7857,1753-5557,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +materials testing,0025-5300,2195-8572,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,WALTER DE GRUYTER GMBH,NA +materials today,1369-7021,1873-4103,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +materials today advances,2590-0498,2590-0498,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +materials today bio,2590-0064,2590-0064,NA,0,0,1,0,"Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,ELSEVIER,NA +materials today chemistry,2468-5194,2468-5194,NA,0,0,1,0,"Chemistry, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +materials today communications,2352-4928,2352-4928,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +materials today energy,2468-6069,2468-6069,NA,0,0,1,0,"Chemistry, Physical | Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +materials today nano,2588-8420,2588-8420,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +materials today physics,2542-5293,2542-5293,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER,NA +materials today sustainability,2589-2347,2589-2347,NA,0,0,1,0,"Green & Sustainable Science & Technology | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +materials transactions,1345-9678,1347-5320,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,JAPAN INST METALS & MATERIALS,NA +materialwissenschaft und werkstofftechnik,0933-5137,1521-4052,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +maternal and child health journal,1092-7875,1573-6628,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SPRINGER/PLENUM PUBLISHERS,NA +maternal and child nutrition,1740-8695,1740-8709,NA,0,0,1,0,Nutrition & Dietetics | Pediatrics,NA,NA,WILEY,NA +mathematica scandinavica,0025-5521,1903-1807,NA,0,0,1,0,Mathematics,NA,NA,MATEMATISK INST,NA +mathematica slovaca,0139-9918,1337-2211,NA,0,0,1,0,Mathematics,NA,NA,WALTER DE GRUYTER GMBH,NA +mathematical and computer modelling of dynamical systems,1387-3954,1744-5051,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Mathematics, Applied",NA,NA,TAYLOR & FRANCIS INC,NA +mathematical biosciences,0025-5564,1879-3134,NA,0,0,1,0,Biology | Mathematical & Computational Biology,NA,NA,ELSEVIER SCIENCE INC,NA +mathematical biosciences and engineering,1547-1063,1551-0018,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +mathematical communications,1331-0623,1331-0623,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,"UNIV OSIJEK, DEPT MATHEMATICS",NA +mathematical control and related fields,2156-8472,2156-8499,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +mathematical finance,0960-1627,1467-9965,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Business, Finance | Economics | Social Sciences, Mathematical Methods",NA,WILEY,NA +mathematical finance,0960-1627,1467-9965,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Business, Finance | Economics | Social Sciences, Mathematical Methods",NA,WILEY,NA +mathematical geosciences,1874-8961,1874-8953,NA,0,0,1,0,"Geosciences, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER HEIDELBERG,NA +mathematical inequalities & applications,1331-4343,1331-4343,NA,0,0,1,0,Mathematics,NA,NA,ELEMENT,NA +mathematical intelligencer,0343-6993,1866-7414,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +mathematical logic quarterly,0942-5616,1521-3870,NA,0,0,1,0,Mathematics | Logic,NA,NA,WILEY-V C H VERLAG GMBH,NA +mathematical medicine and biology-a journal of the ima,1477-8599,1477-8602,NA,0,0,1,0,Biology | Mathematical & Computational Biology,NA,NA,OXFORD UNIV PRESS,NA +mathematical methods in the applied sciences,0170-4214,1099-1476,NA,0,0,1,0,"Mathematics, Applied",NA,NA,WILEY,NA +mathematical methods of operations research,1432-2994,1432-5217,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +mathematical modelling and analysis,1392-6292,1648-3510,NA,0,0,1,0,Mathematics,NA,NA,VILNIUS GEDIMINAS TECH UNIV,NA +mathematical modelling of natural phenomena,0973-5348,1760-6101,NA,0,0,1,0,"Mathematical & Computational Biology | Mathematics, Applied | Mathematics, Interdisciplinary Applications",NA,NA,EDP SCIENCES S A,NA +mathematical models & methods in applied sciences,0218-2025,1793-6314,NA,0,0,1,0,"Mathematics, Applied",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +mathematical notes,0001-4346,1573-8876,NA,0,0,1,0,Mathematics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +mathematical physics analysis and geometry,1385-0172,1572-9656,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,SPRINGER,NA +mathematical population studies,0889-8480,1547-724X,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Demography | Social Sciences, Mathematical Methods",NA,TAYLOR & FRANCIS INC,NA +mathematical population studies,0889-8480,1547-724X,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Demography | Social Sciences, Mathematical Methods",NA,TAYLOR & FRANCIS INC,NA +mathematical problems in engineering,1024-123X,1563-5147,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,HINDAWI LTD,NA +mathematical proceedings of the cambridge philosophical society,0305-0041,1469-8064,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +mathematical programming,0025-5610,1436-4646,NA,0,0,1,0,"Computer Science, Software Engineering | Operations Research & Management Science | Mathematics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +mathematical reports,1582-3067,1582-3067,NA,0,0,1,0,Mathematics,NA,NA,EDITURA ACAD ROMANE,NA +mathematical research letters,1073-2780,1945-001X,NA,0,0,1,0,Mathematics,NA,NA,"INT PRESS BOSTON, INC",NA +mathematical sciences,2008-1359,2251-7456,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER HEIDELBERG,NA +mathematical social sciences,0165-4896,1879-3118,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Economics | Social Sciences, Mathematical Methods",NA,ELSEVIER,NA +mathematical social sciences,0165-4896,1879-3118,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Economics | Social Sciences, Mathematical Methods",NA,ELSEVIER,NA +mathematical structures in computer science,0960-1295,1469-8072,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,CAMBRIDGE UNIV PRESS,NA +mathematical thinking and learning,1098-6065,1532-7833,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +mathematics,2227-7390,2227-7390,MathematicsMDPI,0,0,1,1,Mathematics,NA,NA,MDPI,2018-01-23 +mathematics and computers in simulation,0378-4754,1872-7166,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Software Engineering | Mathematics, Applied",NA,NA,ELSEVIER,NA +mathematics and financial economics,1862-9679,1862-9660,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Business, Finance | Economics | Social Sciences, Mathematical Methods",NA,SPRINGER HEIDELBERG,NA +mathematics and financial economics,1862-9679,1862-9660,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Business, Finance | Economics | Social Sciences, Mathematical Methods",NA,SPRINGER HEIDELBERG,NA +mathematics and mechanics of solids,1081-2865,1741-3028,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mathematics, Interdisciplinary Applications | Mechanics",NA,NA,SAGE PUBLICATIONS LTD,NA +mathematics in engineering,2640-3501,2640-3501,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +mathematics of computation,0025-5718,1088-6842,NA,0,0,1,0,"Mathematics, Applied",NA,NA,AMER MATHEMATICAL SOC,NA +mathematics of control signals and systems,0932-4194,1435-568X,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic | Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER LONDON LTD,NA +mathematics of operations research,0364-765X,1526-5471,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,INFORMS,NA +mathematika,0025-5793,2041-7942,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WILEY,NA +mathematische annalen,0025-5831,1432-1807,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +mathematische nachrichten,0025-584X,1522-2616,NA,0,0,1,0,Mathematics,NA,NA,WILEY-V C H VERLAG GMBH,NA +mathematische zeitschrift,0025-5874,1432-1823,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +matrix biology,0945-053X,1569-1802,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,ELSEVIER,NA +matter,2590-2393,2590-2385,Matter_CP,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER,2018-10-10 +matter and radiation at extremes,2468-2047,2468-080X,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,AIP PUBLISHING,NA +maturitas,0378-5122,1873-4111,NA,0,0,1,0,Geriatrics & Gerontology | Obstetrics & Gynecology,NA,NA,ELSEVIER IRELAND LTD,NA +mausam,0252-9416,0252-9416,MausamJournal,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,INDIA METEOROLOGICAL DEPT,2021-09-30 +maydica,0025-6153,2279-8013,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,MAYDICA-IST SPER CEREALICOLTUR,NA +mayo clinic proceedings,0025-6196,1942-5546,MayoProceedings,0,0,1,1,"Medicine, General & Internal",NA,NA,ELSEVIER SCIENCE INC,2009-04-28 +mbio,2150-7511,2150-7511,mbiojournal,0,0,1,1,Microbiology,NA,NA,AMER SOC MICROBIOLOGY,2009-07-08 +mcn-the american journal of maternal-child nursing,0361-929X,1539-0683,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +mcn-the american journal of maternal-child nursing,0361-929X,1539-0683,NA,0,1,1,0,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +meanjin,0025-6293,1448-8094,Meanjin,1,0,0,1,NA,NA,Literary Reviews,MEANJIN COMPANY LTD,2009-04-03 +measurement,0263-2241,1873-412X,NA,0,0,1,0,"Engineering, Multidisciplinary | Instruments & Instrumentation",NA,NA,ELSEVIER SCI LTD,NA +measurement & control,0020-2940,2051-8730,NA,0,0,1,0,Automation & Control Systems | Instruments & Instrumentation,NA,NA,SAGE PUBLICATIONS LTD,NA +measurement and evaluation in counseling and development,0748-1756,1947-6302,NA,0,1,0,0,NA,"Psychology, Educational | Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +measurement in physical education and exercise science,1091-367X,1532-7841,NA,0,1,1,0,Sport Sciences,"Education & Educational Research | Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +measurement in physical education and exercise science,1091-367X,1532-7841,NA,0,1,1,0,Sport Sciences,"Education & Educational Research | Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +measurement science and technology,0957-0233,1361-6501,NA,0,0,1,0,"Engineering, Multidisciplinary | Instruments & Instrumentation",NA,NA,IOP PUBLISHING LTD,NA +measurement science review,1335-8871,1335-8871,NA,0,0,1,0,Instruments & Instrumentation,NA,NA,SCIENDO,NA +meat science,0309-1740,1873-4138,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER SCI LTD,NA +meccanica,0025-6455,1572-9648,NA,0,0,1,0,Mechanics,NA,NA,SPRINGER,NA +mechanical engineering,0025-6501,1943-5649,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASME,NA +mechanical sciences,2191-9151,2191-916X,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,COPERNICUS GESELLSCHAFT MBH,NA +mechanical systems and signal processing,0888-3270,1096-1216,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +mechanics & industry,2257-7777,2257-7750,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,EDP SCIENCES S A,NA +mechanics based design of structures and machines,1539-7734,1539-7742,NA,0,0,1,0,Mechanics,NA,NA,TAYLOR & FRANCIS INC,NA +mechanics of advanced materials and structures,1537-6494,1537-6532,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mechanics | Materials Science, Characterization, Testing | Materials Science, Composites",NA,NA,TAYLOR & FRANCIS INC,NA +mechanics of composite materials,0191-5665,1573-8922,NA,0,0,1,0,"Mechanics | Materials Science, Composites | Polymer Science",NA,NA,SPRINGER,NA +mechanics of materials,0167-6636,1872-7743,MECMAT_journal,0,0,1,1,"Materials Science, Multidisciplinary | Mechanics",NA,NA,ELSEVIER,2021-10-14 +mechanics of solids,0025-6544,1934-7936,NA,0,0,1,0,Mechanics,NA,NA,PLEIADES PUBLISHING INC,NA +mechanics of time-dependent materials,1385-2000,1573-2738,NA,0,0,1,0,"Mechanics | Materials Science, Characterization, Testing",NA,NA,SPRINGER,NA +mechanics research communications,0093-6413,1873-3972,NA,0,0,1,0,Mechanics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +mechanika,1392-1207,2029-6983,NA,0,0,1,0,Mechanics,NA,NA,KAUNAS UNIV TECHNOL,NA +mechanism and machine theory,0094-114X,1873-3999,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +mechanisms of ageing and development,0047-6374,1872-6216,NA,0,0,1,0,Cell Biology | Geriatrics & Gerontology,NA,NA,ELSEVIER IRELAND LTD,NA +mechatronics,0957-4158,0957-4158,NA,0,0,1,0,"Automation & Control Systems | Engineering, Electrical & Electronic | Engineering, Mechanical | Robotics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +medecine nucleaire-imagerie fonctionnelle et metabolique,0928-1258,1878-6820,NA,0,0,1,0,Pathology,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +media and communication,2183-2439,2183-2439,CogitatioMaC,0,1,0,1,NA,Communication,NA,COGITATIO PRESS,2014-06-12 +media culture & society,0163-4437,1460-3675,NA,0,1,0,0,NA,Communication | Sociology,NA,SAGE PUBLICATIONS LTD,NA +media international australia,1329-878X,2200-467X,media_int_aus,0,1,0,1,NA,Communication,NA,SAGE PUBLICATIONS LTD,2013-12-18 +media psychology,1521-3269,1532-785X,mediapsychmep,1,1,0,1,NA,"Communication | Psychology, Applied","Film, Radio, Television","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-12-27 +media psychology,1521-3269,1532-785X,mediapsychmep,1,1,0,1,NA,"Communication | Psychology, Applied","Film, Radio, Television","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-12-27 +mediators of inflammation,0962-9351,1466-1861,NA,0,0,1,0,Cell Biology | Immunology,NA,NA,HINDAWI LTD,NA +medical & biological engineering & computing,0140-0118,1741-0444,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Biomedical | Mathematical & Computational Biology | Medical Informatics",NA,NA,SPRINGER HEIDELBERG,NA +medical and veterinary entomology,0269-283X,1365-2915,MedVet_Ent,0,0,1,1,Entomology | Veterinary Sciences,NA,NA,WILEY,2017-06-28 +medical anthropology,0145-9740,1545-5882,MedAnthropology,0,1,0,1,NA,"Anthropology | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-04-22 +medical anthropology quarterly,0745-5194,1548-1387,medanthq,0,1,0,1,NA,"Anthropology | Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,WILEY,2011-12-06 +medical care,0025-7079,1537-1948,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health",Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +medical care,0025-7079,1537-1948,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health",Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +medical care research and review,1077-5587,1552-6801,MCRRSage,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,SAGE PUBLICATIONS INC,2018-06-07 +medical care research and review,1077-5587,1552-6801,MCRRSage,0,1,1,1,Health Care Sciences & Services,Health Policy & Services,NA,SAGE PUBLICATIONS INC,2018-06-07 +medical clinics of north america,0025-7125,1557-9859,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +medical decision making,0272-989X,1552-681X,MedDecMak,0,1,1,1,Health Care Sciences & Services | Medical Informatics,Health Policy & Services,NA,SAGE PUBLICATIONS INC,2013-03-06 +medical decision making,0272-989X,1552-681X,MedDecMak,0,1,1,1,Health Care Sciences & Services | Medical Informatics,Health Policy & Services,NA,SAGE PUBLICATIONS INC,2013-03-06 +medical dosimetry,0958-3947,1873-4022,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,NA +medical education,0308-0110,1365-2923,MedEd_Journal,0,0,1,1,"Education, Scientific Disciplines | Health Care Sciences & Services",NA,NA,WILEY,2017-02-07 +medical education online,1087-2981,1087-2981,NA,0,1,0,0,NA,Education & Educational Research,NA,TAYLOR & FRANCIS LTD,NA +medical engineering & physics,1350-4533,1873-4030,EiC_MedEngPhys,0,0,1,1,"Engineering, Biomedical",NA,NA,ELSEVIER SCI LTD,NA +medical history,0025-7273,2048-8343,NA,1,1,1,0,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,CAMBRIDGE UNIV PRESS,NA +medical history,0025-7273,2048-8343,NA,1,1,1,0,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,CAMBRIDGE UNIV PRESS,NA +medical history,0025-7273,2048-8343,NA,1,1,1,0,History & Philosophy Of Science | Health Care Sciences & Services,History & Philosophy Of Science,History & Philosophy Of Science,CAMBRIDGE UNIV PRESS,NA +medical humanities,1468-215X,1473-4265,MedHums_BMJ,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",BMJ PUBLISHING GROUP,2010-05-07 +medical hypotheses,0306-9877,1532-2777,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,CHURCHILL LIVINGSTONE,NA +medical image analysis,1361-8415,1361-8423,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications | Engineering, Biomedical | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER,NA +medical journal of australia,0025-729X,1326-5377,theMJA,0,0,1,1,"Medicine, General & Internal",NA,NA,WILEY,2010-06-08 +medical law review,0967-0742,1464-3790,NA,0,1,1,0,"Medicine, Legal",Law,NA,OXFORD UNIV PRESS,NA +medical law review,0967-0742,1464-3790,NA,0,1,1,0,"Medicine, Legal",Law,NA,OXFORD UNIV PRESS,NA +medical letter on drugs and therapeutics,0025-732X,1523-2859,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,MED LETTER INC,NA +medical microbiology and immunology,0300-8584,1432-1831,NA,0,0,1,0,Immunology | Microbiology,NA,NA,SPRINGER,NA +medical molecular morphology,1860-1480,1860-1499,NA,0,0,1,0,Pathology,NA,NA,SPRINGER JAPAN KK,NA +medical mycology,1369-3786,1460-2709,NA,0,0,1,0,Infectious Diseases | Mycology | Veterinary Sciences,NA,NA,OXFORD UNIV PRESS,NA +medical oncology,1357-0560,1559-131X,NA,0,0,1,0,Oncology,NA,NA,HUMANA PRESS INC,NA +medical physics,0094-2405,2473-4209,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,NA +medical principles and practice,1011-7571,1423-0151,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,KARGER,NA +medical problems of performing artists,0885-1158,1938-2766,NA,1,0,1,0,"Medicine, General & Internal",NA,Music,SCIENCE & MEDICINE INC,NA +medical problems of performing artists,0885-1158,1938-2766,NA,1,0,1,0,"Medicine, General & Internal",NA,Music,SCIENCE & MEDICINE INC,NA +medical science monitor,1643-3750,1643-3750,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,"INT SCIENTIFIC INFORMATION, INC",NA +medical teacher,0142-159X,1466-187X,MedTeachJournal,0,0,1,1,"Education, Scientific Disciplines | Health Care Sciences & Services",NA,NA,TAYLOR & FRANCIS LTD,2011-07-21 +medical ultrasonography,1844-4172,2066-8643,NA,0,0,1,0,"Acoustics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SOC ROMANA ULTRASONOGRAFE MEDICINA BIOLOGIE-SRUMB,NA +medicc review,1555-7960,1555-7960,ReviewMedicc,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,MEDICC-MED EDUC COOPERATION CUBA,2018-08-30 +medicc review,1555-7960,1555-7960,ReviewMedicc,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,MEDICC-MED EDUC COOPERATION CUBA,2018-08-30 +medicina-buenos aires,0025-7680,1669-9106,RevMedicinaBA,0,0,1,1,"Medicine, General & Internal",NA,NA,MEDICINA (BUENOS AIRES),2021-12-05 +medicina-lithuania,1010-660X,1648-9144,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MDPI,NA +medicina clinica,0025-7753,1578-8989,MedClinBarc,0,0,1,1,"Medicine, General & Internal",NA,NA,ELSEVIER ESPANA SLU,2016-03-07 +medicina del lavoro,0025-7818,0025-7818,del_work,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,MATTIOLI 1885,2020-02-05 +medicina dello sport,0025-7826,1827-1863,NA,0,0,1,0,"Medicine, General & Internal | Sport Sciences",NA,NA,EDIZIONI MINERVA MEDICA,NA +medicina intensiva,0210-5691,1578-6749,NA,0,0,1,0,Critical Care Medicine,NA,NA,ELSEVIER ESPANA SLU,NA +medicina oral patologia oral y cirugia bucal,1698-6946,1698-6946,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,MEDICINA ORAL S L,NA +medicinal chemistry,1573-4064,1875-6638,NA,0,0,1,0,"Chemistry, Medicinal",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +medicinal chemistry research,1054-2523,1554-8120,MedChemRes,0,0,1,1,"Chemistry, Medicinal",NA,NA,SPRINGER BIRKHAUSER,2021-03-03 +medicinal research reviews,0198-6325,1098-1128,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,WILEY,NA +medicine,0025-7974,1536-5964,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +medicine & science in sports & exercise,0195-9131,1530-0315,mediterranean botany,0,0,1,1,Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2018-08-26 +medicine health care and philosophy,1386-7423,1572-8633,NA,1,1,0,0,NA,History & Philosophy Of Science | Ethics,History & Philosophy Of Science,SPRINGER,NA +medicine health care and philosophy,1386-7423,1572-8633,NA,1,1,0,0,NA,History & Philosophy Of Science | Ethics,History & Philosophy Of Science,SPRINGER,NA +medicine science and the law,0025-8024,2042-1818,NA,0,1,1,0,"Medicine, Legal",Law,NA,SAGE PUBLICATIONS INC,NA +medicine science and the law,0025-8024,2042-1818,NA,0,1,1,0,"Medicine, Legal",Law,NA,SAGE PUBLICATIONS INC,NA +medieval archaeology,0076-6097,1745-817X,SocMedArch,1,0,0,1,NA,NA,Medieval & Renaissance Studies | Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-02-06 +medieval history journal,0971-9458,0973-0753,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,SAGE PUBLICATIONS INC,NA +medioevo-rivista di storia della filosofia medievale,0391-2566,NA,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,IL POLIGRAFO,NA +mediterranea-ricerche storiche,1828-230X,1828-230X,NA,1,0,0,0,NA,NA,History,MEDITERRANEA,NA +mediterranean archaeology & archaeometry,1108-9628,2241-8121,NA,1,0,0,0,NA,NA,Archaeology,"UNIV AGEAN, DEPT MEDITERRANEAN STUD",NA +mediterranean botany,2603-9109,2603-9109,MedBotany,0,0,1,1,Plant Sciences,NA,NA,"UNIV COMPLUTENSE MADRID, SERVICIO PUBLICACIONES",2018-04-24 +mediterranean historical review,0951-8967,1743-940X,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +mediterranean historical review,0951-8967,1743-940X,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +mediterranean journal of hematology and infectious diseases,2035-3006,2035-3006,NA,0,0,1,0,Hematology | Infectious Diseases,NA,NA,MATTIOLI 1885,NA +mediterranean journal of mathematics,1660-5446,1660-5454,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +mediterranean marine science,1108-393X,1791-6763,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,"NATL CENTRE MARINE RESEARCH",NA +mediterranean politics,1362-9395,1743-9418,medit_politics,0,1,0,1,NA,Area Studies | International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-03-13 +medium aevum,0025-8385,NA,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,SOC STUDY MEDIEVAL LANGUAGE LITERATURE,NA +medizinische genetik,0936-5931,1863-5490,NA,0,0,1,0,Genetics & Heredity,NA,NA,WALTER DE GRUYTER GMBH,NA +medizinische klinik-intensivmedizin und notfallmedizin,2193-6218,2193-6226,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SPRINGER HEIDELBERG,NA +medycyna pracy,0465-5893,2353-1339,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,"NOFER INST OCCUPATIONAL MEDICINE, SW",NA +medycyna weterynaryjna-veterinary medicine-science and practice,0025-8628,0025-8628,NA,0,0,1,0,Veterinary Sciences,NA,NA,POLISH SOC VETERINARY SCIENCES EDITORIAL OFFICE,NA +melanges de la casa de velazquez,0076-230X,2173-1306,NA,1,0,0,0,NA,NA,"History | Literature, Romance",CASA VELAZQUEZ,NA +melanoma research,0960-8931,1473-5636,Melanoma_Res,0,0,1,1,"Oncology | Dermatology | Medicine, Research & Experimental",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2017-02-20 +melbourne university law review,0025-8938,1839-3810,melbulrev,0,1,0,1,NA,Law,NA,MELBOURNE UNIV LAW REVIEW ASSOC,2012-03-24 +melus,0163-755X,1946-3170,NA,1,0,0,0,NA,NA,"Literature, American",OXFORD UNIV PRESS INC,NA +membrane and water treatment,2005-8624,2092-7037,NA,0,0,1,0,"Engineering, Chemical | Water Resources",NA,NA,TECHNO-PRESS,NA +membranes,2077-0375,2077-0375,Membranes_MDPI,0,0,1,1,"Chemistry, Physical | Engineering, Chemical | Materials Science, Multidisciplinary | Polymer Science",NA,NA,MDPI,2018-03-09 +memetic computing,1865-9284,1865-9292,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Operations Research & Management Science",NA,NA,SPRINGER HEIDELBERG,NA +memoirs of the american mathematical society,0065-9266,1947-6221,NA,0,0,1,0,Mathematics,NA,NA,AMER MATHEMATICAL SOC,NA +memorias do instituto oswaldo cruz,0074-0276,1678-8060,NA,0,0,1,0,Parasitology | Tropical Medicine,NA,NA,FUNDACO OSWALDO CRUZ,NA +memory,0965-8211,1464-0686,NA,0,1,0,0,NA,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +memory & cognition,0090-502X,1532-5946,NA,0,1,0,0,NA,"Psychology, Experimental",NA,SPRINGER,NA +memory studies,1750-6980,1750-6999,memorystudies,1,1,0,1,NA,Cultural Studies | History,History | Cultural Studies,SAGE PUBLICATIONS INC,2009-09-26 +memory studies,1750-6980,1750-6999,memorystudies,1,1,0,1,NA,Cultural Studies | History,History | Cultural Studies,SAGE PUBLICATIONS INC,2009-09-26 +men and masculinities,1097-184X,1552-6828,NA,0,1,0,0,NA,Sociology,NA,SAGE PUBLICATIONS INC,NA +mendeleev communications,0959-9436,1364-551X,MendeleevCommun,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,ELSEVIER,2020-08-03 +menopause-the journal of the north american menopause society,1072-3714,1530-0374,MenopauseJrnl,0,0,1,1,Obstetrics & Gynecology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2015-11-03 +mental health and physical activity,1755-2966,1878-0199,NA,0,1,0,0,NA,Psychiatry,NA,ELSEVIER SCI LTD,NA +merkur-deutsche zeitschrift fur europaisches denken,0026-0096,NA,redaktionmerkur,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",KLETT-COTTA VERLAG,2012-10-08 +merrill-palmer quarterly-journal of developmental psychology,0272-930X,1535-0266,NA,0,1,0,0,NA,"Psychology, Development",NA,WAYNE STATE UNIV PRESS,NA +mester,0160-2764,0160-2764,NA,1,0,0,0,NA,NA,"Literature, Romance","UNIV CALIF LOS ANGELES, UCLA COLL, HUMANITIES DIVISION",NA +meta,0026-0452,0026-0452,NA,1,0,0,0,NA,NA,Language & Linguistics,PRESSES UNIV MONTREAL,NA +metabolic brain disease,0885-7490,1573-7365,NA,0,0,1,0,Endocrinology & Metabolism | Neurosciences,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +metabolic engineering,1096-7176,1096-7184,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +metabolic syndrome and related disorders,1540-4196,1557-8518,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,"MARY ANN LIEBERT, INC",NA +metabolism-clinical and experimental,0026-0495,1532-8600,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +metabolites,2218-1989,2218-1989,MetabolitesMDPI,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,MDPI,2016-05-25 +metabolomics,1573-3882,1573-3890,metabolomics,0,0,1,1,Endocrinology & Metabolism,NA,NA,SPRINGER,2009-03-22 +metacognition and learning,1556-1623,1556-1631,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,SPRINGER,NA +metal science and heat treatment,0026-0673,1573-8973,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER,NA +metallomics,1756-5901,1756-591X,Metallomics,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,OXFORD UNIV PRESS,2009-03-20 +metallurgia italiana,0026-0843,0026-0843,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,ASSOC ITALIANA METALLURGIA,NA +metallurgical and materials transactions a-physical metallurgy and materials science,1073-5623,1543-1940,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,SPRINGER,NA +metallurgical and materials transactions b-process metallurgy and materials processing science,1073-5615,1543-1916,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,SPRINGER,NA +metallurgical research & technology,2271-3646,2271-3654,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,EDP SCIENCES S A,NA +metallurgist,0026-0894,1573-8892,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER,NA +metals,2075-4701,2075-4701,Metals_MDPI,0,0,1,1,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,MDPI,2015-10-16 +metals and materials international,1598-9623,2005-4149,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,KOREAN INST METALS MATERIALS,NA +metaphilosophy,0026-1068,1467-9973,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +metaphor and symbol,1092-6488,1532-7868,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +metaphor and symbol,1092-6488,1532-7868,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +meteoritics & planetary science,1086-9379,1945-5100,MeteoriticsPS,0,0,1,1,Geochemistry & Geophysics,NA,NA,WILEY,2021-02-15 +meteorological applications,1350-4827,1469-8080,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,WILEY,NA +meteorologische zeitschrift,0941-2948,1610-1227,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +meteorology and atmospheric physics,0177-7971,1436-5065,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,SPRINGER WIEN,NA +method & theory in the study of religion,0943-3058,1570-0682,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +methodology-european journal of research methods for the behavioral and social sciences,1614-1881,1614-2241,NA,0,1,0,0,NA,"Social Sciences, Mathematical Methods | Psychology, Mathematical",NA,PSYCHOPEN,NA +methodology and computing in applied probability,1387-5841,1573-7713,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER,NA +methods,1046-2023,1095-9130,NA,0,0,1,0,Biochemical Research Methods | Biochemistry & Molecular Biology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +methods and applications in fluorescence,2050-6120,2050-6120,NA,0,0,1,0,"Chemistry, Analytical | Chemistry, Physical",NA,NA,IOP PUBLISHING LTD,NA +methods in cell biology,0091-679X,NA,NA,0,0,1,0,Cell Biology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +methods in ecology and evolution,2041-210X,2041-2096,MethodsEcolEvol,0,0,1,1,Ecology,NA,NA,WILEY,2009-11-05 +methods in enzymology,0076-6879,1557-7988,NA,0,0,1,0,Biochemical Research Methods | Biochemistry & Molecular Biology,NA,NA,ACADEMIC PRESS LTD-ELSEVIER SCIENCE LTD,NA +methods in microbiology,0580-9517,NA,NA,0,0,1,0,Biochemical Research Methods | Microbiology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +methods of information in medicine,0026-1270,2511-705X,NA,0,0,1,0,"Computer Science, Information Systems | Health Care Sciences & Services | Medical Informatics",NA,NA,GEORG THIEME VERLAG KG,NA +metrika,0026-1335,1435-926X,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER HEIDELBERG,NA +metroeconomica,0026-1386,1467-999X,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +metrologia,0026-1394,1681-7575,NA,0,0,1,0,"Instruments & Instrumentation | Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +metrology and measurement systems,0860-8229,2300-1941,NA,0,0,1,0,Instruments & Instrumentation,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES",NA +metropolitan museum journal,0077-8958,2169-3072,NA,1,0,0,0,NA,NA,Art,UNIV CHICAGO PRESS,NA +metropolitan museum of art bulletin,0026-1521,NA,NA,1,0,0,0,NA,NA,Art,METROPOLITAN MUSEUM ART,NA +metu journal of the faculty of architecture,0258-5316,0258-5316,NA,1,0,0,0,NA,NA,Architecture,MIDDLE EAST TECHNICAL UNIV,NA +mexican studies-estudios mexicanos,0742-9797,1533-8320,MSEM_Journal,1,0,0,1,NA,NA,History,UNIV CALIFORNIA PRESS,NA +mfs-modern fiction studies,0026-7724,1080-658X,MFSjournal,1,0,0,1,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,2022-01-26 +michigan historical review,0360-1846,NA,NA,1,0,0,0,NA,NA,History,CENTRAL MICHIGAN UNIV CLARKE HISTORICAL LIBRARY,NA +michigan law review,0026-2234,1939-8557,michlawreview,0,1,0,1,NA,Law,NA,MICH LAW REV ASSOC,2009-09-02 +michigan mathematical journal,0026-2285,NA,NA,0,0,1,0,Mathematics,NA,NA,MICHIGAN MATHEMATICAL JOURNAL,NA +michigan quarterly review,0026-2420,0026-2420,NA,1,0,0,0,NA,NA,Literary Reviews,UNIV MICHIGAN,NA +micro & nano letters,1750-0443,1750-0443,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,WILEY,NA +microbes and environments,1342-6311,1342-6311,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,"JAPANESE SOC MICROBIAL ECOLOGY, DEPT BIORESOURCE SCIENCE",NA +microbes and infection,1286-4579,1769-714X,NA,0,0,1,0,Immunology | Infectious Diseases | Microbiology,NA,NA,ELSEVIER,NA +microbial biotechnology,1751-7915,1751-7915,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,WILEY,NA +microbial cell factories,1475-2859,1475-2859,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,BMC,NA +microbial drug resistance,1076-6294,1931-8448,NA,0,0,1,0,Infectious Diseases | Microbiology | Pharmacology & Pharmacy,NA,NA,"MARY ANN LIEBERT, INC",NA +microbial ecology,0095-3628,1432-184X,NA,0,0,1,0,Ecology | Marine & Freshwater Biology | Microbiology,NA,NA,SPRINGER,NA +microbial genomics,2057-5858,2057-5858,NA,0,0,1,0,Genetics & Heredity | Microbiology,NA,NA,MICROBIOLOGY SOC,NA +microbial pathogenesis,0882-4010,1096-1208,NA,0,0,1,0,Immunology | Microbiology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +microbial physiology,2673-1665,2673-1673,NA,0,0,1,0,Microbiology | Biotechnology & Applied Microbiology,NA,NA,KARGER,NA +microbial risk analysis,2352-3522,2352-3530,NA,0,0,1,0,Environmental Sciences | Food Science & Technology | Microbiology,NA,NA,ELSEVIER,NA +microbiological research,0944-5013,1618-0623,NA,0,0,1,0,Microbiology,NA,NA,ELSEVIER GMBH,NA +microbiology,0026-2617,1608-3237,NA,0,0,1,0,Microbiology,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +microbiology-sgm,1350-0872,1465-2080,NA,0,0,1,0,Microbiology,NA,NA,MICROBIOLOGY SOC,NA +microbiology and immunology,0385-5600,1348-0421,NA,0,0,1,0,Immunology | Microbiology,NA,NA,WILEY,NA +microbiology and molecular biology reviews,1092-2172,1098-5557,NA,0,0,1,0,Microbiology,NA,NA,AMER SOC MICROBIOLOGY,NA +microbiology spectrum,2165-0497,2165-0497,JournalSpectrum,0,0,1,1,Microbiology,NA,NA,AMER SOC MICROBIOLOGY,2021-03-12 +microbiologyopen,2045-8827,2045-8827,microbiologyOA,0,0,1,1,Microbiology,NA,NA,WILEY,2017-10-26 +microbiome,2049-2618,2049-2618,MicrobiomeJ,0,0,1,1,Microbiology,NA,NA,BMC,2013-01-17 +microchemical journal,0026-265X,1095-9149,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,ELSEVIER,NA +microchimica acta,0026-3672,1436-5073,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,SPRINGER WIEN,NA +microcirculation,1073-9688,1549-8719,NA,0,0,1,0,Hematology | Peripheral Vascular Diseases,NA,NA,WILEY,NA +microelectronic engineering,0167-9317,1873-5568,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Optics | Physics, Applied",NA,NA,ELSEVIER,NA +microelectronics international,1356-5362,1758-812X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +microelectronics journal,0026-2692,1879-2391,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology",NA,NA,ELSEVIER SCI LTD,NA +microelectronics reliability,0026-2714,1872-941X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Physics, Applied",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +microfluidics and nanofluidics,1613-4982,1613-4990,NA,0,0,1,0,"Nanoscience & Nanotechnology | Instruments & Instrumentation | Physics, Fluids & Plasmas",NA,NA,SPRINGER HEIDELBERG,NA +microgravity science and technology,0938-0108,1875-0494,NA,0,0,1,0,"Engineering, Aerospace | Thermodynamics | Mechanics",NA,NA,SPRINGER,NA +micromachines,2072-666X,2072-666X,micromach_mdpi,0,0,1,1,"Chemistry, Analytical | Nanoscience & Nanotechnology | Instruments & Instrumentation | Physics, Applied",NA,NA,MDPI,2016-04-12 +micron,0968-4328,1878-4291,NA,0,0,1,0,Microscopy,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +microorganisms,2076-2607,2076-2607,Micro_MDPI,0,0,1,1,Microbiology,NA,NA,MDPI,2015-09-21 +micropaleontology,0026-2803,1937-2795,NA,0,0,1,0,Paleontology,NA,NA,MICRO PRESS,NA +microporous and mesoporous materials,1387-1811,1873-3093,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +microprocessors and microsystems,0141-9331,1872-9436,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods | Engineering, Electrical & Electronic",NA,NA,ELSEVIER,NA +microscopy,2050-5698,2050-5701,NA,0,0,1,0,Microscopy,NA,NA,OXFORD UNIV PRESS,NA +microscopy and microanalysis,1431-9276,1435-8115,MAMtheJournal,0,0,1,1,"Materials Science, Multidisciplinary | Microscopy",NA,NA,CAMBRIDGE UNIV PRESS,2019-04-16 +microscopy research and technique,1059-910X,1097-0029,NA,0,0,1,0,Anatomy & Morphology | Biology | Microscopy,NA,NA,WILEY,NA +microsurgery,0738-1085,1098-2752,NA,0,0,1,0,Surgery,NA,NA,WILEY,NA +microsystem technologies-micro-and nanosystems-information storage and processing systems,0946-7076,1432-1858,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +microsystems & nanoengineering,2055-7434,2055-7434,MicrosysNanoeng,0,0,1,1,Nanoscience & Nanotechnology | Instruments & Instrumentation,NA,NA,SPRINGERNATURE,2021-10-17 +microvascular research,0026-2862,1095-9319,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +microwave and optical technology letters,0895-2477,1098-2760,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics",NA,NA,WILEY,NA +microwave journal,0192-6225,NA,MWJeditor,0,0,1,1,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,HORIZON HOUSE PUBLICATIONS INC,2017-03-31 +middle east critique,1943-6149,1943-6157,MidEastCritique,0,1,0,1,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-12-01 +middle east journal,0026-3141,1940-3461,MiddleEastJrnl,0,1,0,1,NA,Area Studies,NA,MIDDLE EAST INST,2020-12-25 +middle east policy,1061-1924,1475-4967,mideastpolicy,0,1,0,1,NA,Area Studies | International Relations,NA,WILEY,2010-01-05 +middle eastern literatures,1475-262X,1475-2638,MELiteratures,1,0,0,1,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-05-21 +middle eastern studies,0026-3206,1743-7881,NA,0,1,0,0,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +midwest quarterly-a journal of contemporary thought,0026-3451,NA,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,PITTSBURG STATE UNIV,NA +midwest studies in philosophy,0363-6550,1475-4975,NA,1,0,0,0,NA,NA,Philosophy,PHILOSOPHY DOCUMENTATION CENTER,NA +midwifery,0266-6138,1532-3099,MidwiferyJnl,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCI LTD,2014-03-03 +midwifery,0266-6138,1532-3099,MidwiferyJnl,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCI LTD,2014-03-03 +migration studies,2049-5838,2049-5846,NA,0,1,0,0,NA,Demography,NA,OXFORD UNIV PRESS,NA +mikrobiyoloji bulteni,0374-9096,0374-9096,NA,0,0,1,0,Microbiology,NA,NA,ANKARA MICROBIOLOGY SOC,NA +milan journal of mathematics,1424-9286,1424-9294,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +milbank quarterly,0887-378X,1468-0009,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,WILEY,NA +milbank quarterly,0887-378X,1468-0009,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,WILEY,NA +militargeschichtliche zeitschrift,2193-2336,2196-6850,NA,1,0,0,0,NA,NA,History,WALTER DE GRUYTER GMBH,NA +military medical research,2095-7467,2054-9369,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,BMC,NA +military medicine,0026-4075,1930-613X,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,OXFORD UNIV PRESS,NA +military operations research,1082-5983,2163-2758,NA,0,0,1,0,Operations Research & Management Science,NA,NA,MILITARY OPERATIONS RESEARCH SOC,NA +military psychology,0899-5605,1532-7876,Mil_Psych,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-11-19 +millennium-journal of international studies,0305-8298,1477-9021,millennjournal,0,1,0,1,NA,International Relations,NA,SAGE PUBLICATIONS LTD,2010-06-24 +millennium film journal,1064-5586,1064-5586,MillennFilmJnl,1,0,0,1,NA,NA,"Film, Radio, Television",MILLENNIUM FILM WORKSHOP INC,2012-09-23 +milli folklor,1300-3984,2146-8087,NA,1,0,0,0,NA,NA,Folklore,GELENEKSEL YAYINCILIK LTD STL,NA +milton quarterly,0026-4326,1094-348X,NA,1,0,0,0,NA,NA,Poetry,WILEY,NA +milton studies,0076-8820,2330-796X,NA,1,0,0,0,NA,NA,Poetry,PENN STATE UNIV PRESS,NA +mind,0026-4423,1460-2113,NA,1,0,0,0,NA,NA,Philosophy,OXFORD UNIV PRESS,NA +mind & language,0268-1064,1468-0017,NA,0,1,0,0,NA,"Linguistics | Psychology, Experimental",NA,WILEY,NA +mind brain and education,1751-2271,1751-228X,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Development",NA,WILEY,NA +mind culture and activity,1074-9039,1532-7884,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +mindfulness,1868-8527,1868-8535,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,SPRINGER,NA +minds and machines,0924-6495,1572-8641,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER,NA +mine water and the environment,1025-9112,1616-1068,NA,0,0,1,0,Water Resources,NA,NA,SPRINGER HEIDELBERG,NA +mineral processing and extractive metallurgy review,0882-7508,1547-7401,NA,0,0,1,0,Metallurgy & Metallurgical Engineering | Mining & Mineral Processing,NA,NA,TAYLOR & FRANCIS INC,NA +mineralium deposita,0026-4598,1432-1866,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,SPRINGER,NA +mineralogical magazine,0026-461X,1471-8022,NA,0,0,1,0,Mineralogy,NA,NA,MINERALOGICAL SOC,NA +mineralogy and petrology,0930-0708,1438-1168,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,SPRINGER WIEN,NA +minerals,2075-163X,2075-163X,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy | Mining & Mineral Processing,NA,NA,MDPI,NA +minerals engineering,0892-6875,0892-6875,NA,0,0,1,0,"Engineering, Chemical | Mineralogy | Mining & Mineral Processing",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +minerva,0026-4695,1573-1871,NA,0,1,0,0,NA,"Education & Educational Research | History & Philosophy Of Science | Social Sciences, Interdisciplinary",NA,SPRINGER,NA +minerva anestesiologica,0375-9393,1827-1596,NA,0,0,1,0,Anesthesiology | Critical Care Medicine,NA,NA,EDIZIONI MINERVA MEDICA,NA +minerva biotechnology and biomolecular research,2724-542X,2724-5934,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,EDIZIONI MINERVA MEDICA,NA +minerva cardiology and angiology,2724-5683,2724-5772,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,EDIZIONI MINERVA MEDICA,NA +minerva endocrinology,2724-6507,2724-6116,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,EDIZIONI MINERVA MEDICA,NA +minerva gastroenterology,2724-5985,2724-5365,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,EDIZIONI MINERVA MEDICA,NA +minerva medica,0026-4806,1827-1669,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,EDIZIONI MINERVA MEDICA,NA +minerva pediatrics,2724-5276,2724-5780,NA,0,0,1,0,Pediatrics,NA,NA,EDIZIONI MINERVA MEDICA,NA +minerva surgery,2724-5691,2724-5438,MinervaChir,0,0,1,1,Surgery,NA,NA,EDIZIONI MINERVA MEDICA,2020-01-17 +minerva urology and nephrology,2724-6051,2724-6442,MUN_journal,0,0,1,1,Urology & Nephrology,NA,NA,EDIZIONI MINERVA MEDICA,2019-02-28 +mini-reviews in medicinal chemistry,1389-5575,1875-5607,NA,0,0,1,0,"Chemistry, Medicinal",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +mini-reviews in organic chemistry,1570-193X,1875-6298,NA,0,0,1,0,"Chemistry, Organic",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +minimally invasive therapy & allied technologies,1364-5706,1365-2931,NA,0,0,1,0,Surgery,NA,NA,TAYLOR & FRANCIS LTD,NA +mining metallurgy & exploration,2524-3462,2524-3470,NA,0,0,1,0,Metallurgy & Metallurgical Engineering | Mining & Mineral Processing,NA,NA,SPRINGER HEIDELBERG,NA +minnesota law review,0026-5535,0026-5535,minnesotalawrev,0,1,0,1,NA,Law,NA,MINN LAW REVIEW FOUND,2014-03-15 +minnesota review,0026-5667,2157-4189,MinnesotaReview,1,0,0,1,NA,NA,Literary Reviews,DUKE UNIV PRESS,2010-09-11 +minnesota symposia on child psychology,0076-9266,2329-5805,NA,0,1,0,0,NA,"Psychology, Development",NA,JOHN WILEY & SONS,NA +mires and peat,1819-754X,1819-754X,MiresandPeat,0,0,1,1,Environmental Sciences,NA,NA,INT PEAT SOC,2018-10-15 +mis quarterly,0276-7783,2162-9730,MISQuarterly,0,1,1,1,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,SOC INFORM MANAGE-MIS RES CENT,2009-02-20 +mis quarterly,0276-7783,2162-9730,MISQuarterly,0,1,1,1,"Computer Science, Information Systems",Information Science & Library Science | Management,NA,SOC INFORM MANAGE-MIS RES CENT,2009-02-20 +mis quarterly executive,1540-1960,1540-1979,NA,0,1,0,0,NA,Information Science & Library Science | Management,NA,"INDIANA UNIV, OPER & DECISION TECHNOL DEPT",NA +miskolc mathematical notes,1787-2405,1787-2413,NA,0,0,1,0,Mathematics,NA,NA,UNIV MISKOLC INST MATH,NA +mississippi quarterly,0026-637X,2689-517X,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,MISSISSIPPI QUARTERLY,NA +missouri review,0191-1961,1548-9930,Missouri_Review,1,0,0,1,NA,NA,Literary Reviews,"UNIV MISSOURI, COLL ARTS & SCIENCE",2010-06-16 +mit sloan management review,1532-9194,1532-8937,mitsmr,0,1,0,1,NA,Business | Management,NA,"SLOAN MANAGEMENT REVIEW ASSOC, MIT SLOAN SCHOOL MANAGEMENT",2008-08-01 +mit technology review,1099-274X,NA,techreview,0,0,1,1,Multidisciplinary Sciences,NA,NA,TECHNOL REV,2008-08-11 +mitigation and adaptation strategies for global change,1381-2386,1573-1596,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +mitochondrial dna part a,2470-1394,2470-1408,NA,0,0,1,0,Genetics & Heredity,NA,NA,TAYLOR & FRANCIS LTD,NA +mitochondrial dna part b-resources,2380-2359,2380-2359,NA,0,0,1,0,Genetics & Heredity,NA,NA,TAYLOR & FRANCIS LTD,NA +mitochondrion,1567-7249,1872-8278,NA,0,0,1,0,Cell Biology | Genetics & Heredity,NA,NA,ELSEVIER SCI LTD,NA +mitteilungen der osterreichischen geographischen gesellschaft,0029-9138,0029-9138,NA,0,1,0,0,NA,Geography,NA,OSTERR GEOGRAPH GESELLSCHAFT,NA +mitteilungen des kunsthistorischen institutes in florenz,0342-1201,NA,NA,1,0,0,0,NA,NA,Art,LIBRERIA SALIMBENI,NA +mitteilungen klosterneuburg,0007-5922,0007-5922,NA,0,0,1,0,Food Science & Technology | Horticulture,NA,NA,HOHERE BUNDESLEHRANSTALT & BUNDESAMT WEIN-& OBSTBAU KLOSTERNEUBURG,NA +mljekarstvo,0026-704X,0026-704X,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,CROATIAN DAIRY UNION,NA +mln,0026-7910,1080-6598,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,JOHNS HOPKINS UNIV PRESS,NA +mmwr-morbidity and mortality weekly report,0149-2195,1545-861X,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,CENTERS DISEASE CONTROL & PREVENTION,NA +mmwr recommendations and reports,1057-5987,1545-8601,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,CENTERS DISEASE CONTROL & PREVENTION,NA +mmwr surveillance summaries,1545-8636,1545-8636,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,CENTERS DISEASE CONTROL & PREVENTION,NA +mnemosyne,0026-7074,1568-525X,NA,1,0,0,0,NA,NA,Classics,BRILL,NA +mobile dna,1759-8753,1759-8753,MobDNAjournal,0,0,1,1,Genetics & Heredity,NA,NA,BMC,2017-02-08 +mobile information systems,1574-017X,1875-905X,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,HINDAWI LTD,NA +mobile media & communication,2050-1579,2050-1587,mobilemediacomm,0,1,0,1,NA,Communication,NA,SAGE PUBLICATIONS INC,2012-02-20 +mobile networks & applications,1383-469X,1572-8153,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems | Telecommunications",NA,NA,SPRINGER,NA +mobilities,1745-0101,1745-011X,NA,0,1,0,0,NA,Geography | Transportation,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +mobilization,1086-671X,1938-1514,mobyjournal,0,1,0,1,NA,Sociology,NA,SAN DIEGO STATE UNIV,2015-03-18 +modeling identification and control,0332-7353,1890-1328,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Cybernetics",NA,NA,MIC,NA +modelling and simulation in materials science and engineering,0965-0393,1361-651X,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +modern & contemporary france,0963-9489,1469-9869,FranceModern,1,0,0,1,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-07-16 +modern asian studies,0026-749X,1469-8099,NA,0,1,0,0,NA,Area Studies,NA,CAMBRIDGE UNIV PRESS,NA +modern china,0097-7004,1552-6836,NA,0,1,0,0,NA,Area Studies,NA,SAGE PUBLICATIONS INC,NA +modern chinese literature and culture,1520-9857,NA,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies | Literature | Asian Studies,FOREIGN LANGUAGE PUBL,NA +modern chinese literature and culture,1520-9857,NA,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies | Literature | Asian Studies,FOREIGN LANGUAGE PUBL,NA +modern drama,0026-7694,1712-5286,NA,1,0,0,0,NA,NA,Theater,UNIV TORONTO PRESS INC,NA +modern intellectual history,1479-2443,1479-2451,MIHJournal,1,0,0,1,NA,NA,History,CAMBRIDGE UNIV PRESS,2018-08-17 +modern italy,1353-2944,1469-9877,NA,1,1,0,0,NA,History | Area Studies,History,CAMBRIDGE UNIV PRESS,NA +modern italy,1353-2944,1469-9877,NA,1,1,0,0,NA,History | Area Studies,History,CAMBRIDGE UNIV PRESS,NA +modern judaism,0276-1114,1086-3273,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",OXFORD UNIV PRESS INC,NA +modern language journal,0026-7902,1540-4781,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,WILEY,NA +modern language quarterly,0026-7929,1527-1943,ModLangQ,1,0,0,1,NA,NA,Literature,DUKE UNIV PRESS,2015-11-11 +modern language review,0026-7937,2222-4319,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,MODERN HUMANITIES RESEARCH ASSOCIATION,NA +modern law review,0026-7961,1468-2230,modernlrev,0,1,0,1,NA,Law,NA,WILEY,2014-10-30 +modern pathology,0893-3952,1530-0285,ModernPathology,0,0,1,1,Pathology,NA,NA,SPRINGERNATURE,2017-01-23 +modern philology,0026-8232,1545-6951,ModernPhilology,1,0,0,1,NA,NA,Literature | Language & Linguistics,UNIV CHICAGO PRESS,2020-04-22 +modern physics letters a,0217-7323,1793-6632,NA,0,0,1,0,"Astronomy & Astrophysics | Physics, Nuclear | Physics, Particles & Fields | Physics, Mathematical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +modern physics letters b,0217-9849,1793-6640,NA,0,0,1,0,"Physics, Applied | Physics, Condensed Matter | Physics, Mathematical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +modern rheumatology,1439-7595,1439-7609,NA,0,0,1,0,Rheumatology,NA,NA,TAYLOR & FRANCIS LTD,NA +modern theology,0266-7177,1468-0025,NA,1,0,0,0,NA,NA,Religion,WILEY,NA +moderna sprak,2000-3560,2000-3560,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,LMS-MODERN LANG TEACHERS ASSOC,NA +modernism-modernity,1071-6068,1080-6601,MModernity,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,2012-06-17 +modernist cultures,2041-1022,1753-8629,modcultures,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",EDINBURGH UNIV PRESS,2015-02-02 +mokuzai gakkaishi,0021-4795,1880-7577,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,JAPAN WOOD RES SOC,NA +molecular & cellular proteomics,1535-9476,1535-9484,molcellprot,0,0,1,1,Biochemical Research Methods,NA,NA,ELSEVIER,2013-01-25 +molecular & cellular toxicology,1738-642X,2092-8467,NA,0,0,1,0,Toxicology,NA,NA,KOREAN SOCIETY TOXICOGENOMICS & TOXICOPROTEOMICS-KSTT,NA +molecular and biochemical parasitology,0166-6851,1872-9428,NA,0,0,1,0,Biochemistry & Molecular Biology | Parasitology,NA,NA,ELSEVIER,NA +molecular and cellular biochemistry,0300-8177,1573-4919,NA,0,0,1,0,Cell Biology,NA,NA,SPRINGER,NA +molecular and cellular biology,0270-7306,1098-5549,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,AMER SOC MICROBIOLOGY,NA +molecular and cellular endocrinology,0303-7207,1872-8057,NA,0,0,1,0,Cell Biology | Endocrinology & Metabolism,NA,NA,ELSEVIER IRELAND LTD,NA +molecular and cellular neuroscience,1044-7431,1095-9327,NA,0,0,1,0,Neurosciences,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +molecular and cellular probes,0890-8508,1096-1194,NA,0,0,1,0,Biochemical Research Methods | Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Cell Biology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +molecular aspects of medicine,0098-2997,1872-9452,MolAspMed,0,0,1,1,"Biochemistry & Molecular Biology | Medicine, Research & Experimental",NA,NA,ELSEVIER,NA +molecular autism,2040-2392,2040-2392,MolecularAutism,0,0,1,1,Genetics & Heredity | Neurosciences,NA,NA,BMC,2010-11-10 +molecular biology,0026-8933,1608-3245,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,PLEIADES PUBLISHING INC,NA +molecular biology and evolution,0737-4038,1537-1719,MolBioEvol,0,0,1,1,Biochemistry & Molecular Biology | Evolutionary Biology | Genetics & Heredity,NA,NA,OXFORD UNIV PRESS,2015-06-18 +molecular biology of the cell,1059-1524,1939-4586,MBoCjournal,0,0,1,1,Cell Biology,NA,NA,AMER SOC CELL BIOLOGY,2015-06-05 +molecular biology reports,0301-4851,1573-4978,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,SPRINGER,NA +molecular biotechnology,1073-6085,1559-0305,NA,0,0,1,0,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology,NA,NA,SPRINGERNATURE,NA +molecular brain,1756-6606,1756-6606,molecularbrain,0,0,1,1,Neurosciences,NA,NA,BMC,2011-01-18 +molecular breeding,1380-3743,1572-9788,NA,0,0,1,0,Agronomy | Plant Sciences | Genetics & Heredity | Horticulture,NA,NA,SPRINGER,NA +molecular cancer,1476-4598,1476-4598,NA,0,0,1,0,Biochemistry & Molecular Biology | Oncology,NA,NA,BMC,NA +molecular cancer research,1541-7786,1557-3125,MCR_AACR,0,0,1,1,Oncology | Cell Biology,NA,NA,AMER ASSOC CANCER RESEARCH,2018-07-24 +molecular cancer therapeutics,1535-7163,1538-8514,MCT_AACR,0,0,1,1,Oncology,NA,NA,AMER ASSOC CANCER RESEARCH,2018-07-24 +molecular carcinogenesis,0899-1987,1098-2744,NA,0,0,1,0,Biochemistry & Molecular Biology | Oncology,NA,NA,WILEY,NA +molecular catalysis,2468-8231,2468-8231,NA,0,0,1,0,"Chemistry, Physical",NA,NA,ELSEVIER,NA +molecular cell,1097-2765,1097-4164,MolecularCell,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,CELL PRESS,2013-04-11 +molecular crystals and liquid crystals,1542-1406,1563-5287,NA,0,0,1,0,"Chemistry, Multidisciplinary | Crystallography | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +molecular cytogenetics,1755-8166,1755-8166,NA,0,0,1,0,Genetics & Heredity,NA,NA,BMC,NA +molecular diagnosis & therapy,1177-1062,1179-2000,NA,0,0,1,0,Genetics & Heredity | Pharmacology & Pharmacy,NA,NA,ADIS INT LTD,NA +molecular diversity,1381-1991,1573-501X,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Medicinal | Chemistry, Multidisciplinary",NA,NA,SPRINGER,NA +molecular ecology,0962-1083,1365-294X,molecology,0,0,1,1,Biochemistry & Molecular Biology | Ecology | Evolutionary Biology,NA,NA,WILEY,2019-03-19 +molecular ecology resources,1755-098X,1755-0998,NA,0,0,1,0,Biochemistry & Molecular Biology | Ecology | Evolutionary Biology,NA,NA,WILEY,NA +molecular genetics & genomic medicine,2324-9269,2324-9269,NA,0,0,1,0,Genetics & Heredity,NA,NA,WILEY,NA +molecular genetics and genomics,1617-4615,1617-4623,NA,0,0,1,0,Biochemistry & Molecular Biology | Genetics & Heredity,NA,NA,SPRINGER HEIDELBERG,NA +molecular genetics and metabolism,1096-7192,1096-7206,NA,0,0,1,0,"Endocrinology & Metabolism | Genetics & Heredity | Medicine, Research & Experimental",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +molecular genetics and metabolism reports,2214-4269,2214-4269,NA,0,0,1,0,Genetics & Heredity,NA,NA,ELSEVIER,NA +molecular genetics microbiology and virology,0891-4168,1934-841X,NA,0,0,1,0,Biochemistry & Molecular Biology | Microbiology,NA,NA,PLEIADES PUBLISHING INC,NA +molecular human reproduction,1360-9947,1460-2407,NA,0,0,1,0,Developmental Biology | Obstetrics & Gynecology | Reproductive Biology,NA,NA,OXFORD UNIV PRESS,NA +molecular imaging,1536-0121,1536-0121,molecularimging,0,0,1,1,"Biochemical Research Methods | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,HINDAWI LTD,2010-01-20 +molecular imaging,1536-0121,1536-0121,molecularimging,0,0,1,1,"Biochemical Research Methods | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,HINDAWI LTD,2010-01-20 +molecular imaging and biology,1536-1632,1860-2002,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +molecular immunology,0161-5890,1872-9142,NA,0,0,1,0,Biochemistry & Molecular Biology | Immunology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +molecular informatics,1868-1743,1868-1751,NA,0,0,1,0,"Chemistry, Medicinal | Computer Science, Interdisciplinary Applications | Mathematical & Computational Biology",NA,NA,WILEY-V C H VERLAG GMBH,NA +molecular medicine,1076-1551,1528-3658,MolMedBMC,0,0,1,1,"Biochemistry & Molecular Biology | Cell Biology | Medicine, Research & Experimental",NA,NA,SPRINGER,2019-09-30 +molecular medicine reports,1791-2997,1791-3004,mol_med,0,0,1,1,"Oncology | Medicine, Research & Experimental",NA,NA,SPANDIDOS PUBL LTD,2018-05-21 +molecular metabolism,2212-8778,2212-8778,MolMetab,0,0,1,1,Endocrinology & Metabolism,NA,NA,ELSEVIER,2014-10-16 +molecular microbiology,0950-382X,1365-2958,MolMicroEditors,0,0,1,1,Biochemistry & Molecular Biology | Microbiology,NA,NA,WILEY,2017-06-10 +molecular neurobiology,0893-7648,1559-1182,NA,0,0,1,0,Neurosciences,NA,NA,SPRINGER,NA +molecular neurodegeneration,1750-1326,1750-1326,MolNeuro,0,0,1,1,Neurosciences,NA,NA,BMC,2010-12-22 +molecular nutrition & food research,1613-4125,1613-4133,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY,NA +molecular omics,NA,2515-4184,MolecularOmics,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,ROYAL SOC CHEMISTRY,2009-03-11 +molecular oncology,1574-7891,1878-0261,MolOncology,0,0,1,1,Oncology,NA,NA,WILEY,2017-11-23 +molecular oral microbiology,2041-1006,2041-1014,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Microbiology",NA,NA,WILEY,NA +molecular pain,1744-8069,1744-8069,NA,0,0,1,0,Neurosciences,NA,NA,SAGE PUBLICATIONS INC,NA +molecular pharmaceutics,1543-8384,1543-8392,Mol_Pharm,0,0,1,1,"Medicine, Research & Experimental | Pharmacology & Pharmacy",NA,NA,AMER CHEMICAL SOC,2015-09-11 +molecular pharmacology,0026-895X,1521-0111,MolPharmJournal,0,0,1,1,Pharmacology & Pharmacy,NA,NA,AMER SOC PHARMACOLOGY EXPERIMENTAL THERAPEUTICS,2012-12-13 +molecular phylogenetics and evolution,1055-7903,1095-9513,NA,0,0,1,0,Biochemistry & Molecular Biology | Evolutionary Biology | Genetics & Heredity,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +molecular physics,0026-8976,1362-3028,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,TAYLOR & FRANCIS LTD,NA +molecular plant,1674-2052,1752-9867,NA,0,0,1,0,Biochemistry & Molecular Biology | Plant Sciences,NA,NA,CELL PRESS,NA +molecular plant-microbe interactions,0894-0282,1943-7706,MPMIjournal,0,0,1,1,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Plant Sciences,NA,NA,AMER PHYTOPATHOLOGICAL SOC,2016-06-08 +molecular plant pathology,1464-6722,1364-3703,MPPjournal,0,0,1,1,Plant Sciences,NA,NA,WILEY,2010-05-11 +molecular psychiatry,1359-4184,1476-5578,molpsychiatry,0,0,1,1,Biochemistry & Molecular Biology | Neurosciences | Psychiatry,NA,NA,SPRINGERNATURE,2021-09-18 +molecular reproduction and development,1040-452X,1098-2795,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology | Developmental Biology | Reproductive Biology,NA,NA,WILEY,NA +molecular simulation,0892-7022,1029-0435,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,TAYLOR & FRANCIS LTD,NA +molecular syndromology,1661-8769,1661-8777,NA,0,0,1,0,Genetics & Heredity,NA,NA,KARGER,NA +molecular systems biology,1744-4292,1744-4292,MolSystBiol,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,WILEY,2009-02-12 +molecular systems design & engineering,2058-9689,2058-9689,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,NA +molecular therapy,1525-0016,1525-0024,NA,0,0,1,0,"Biotechnology & Applied Microbiology | Genetics & Heredity | Medicine, Research & Experimental",NA,NA,CELL PRESS,NA +molecular therapy-methods & clinical development,2329-0501,2329-0501,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,CELL PRESS,NA +molecular therapy-nucleic acids,2162-2531,2162-2531,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,CELL PRESS,NA +molecular therapy-oncolytics,2372-7705,2372-7705,NA,0,0,1,0,"Oncology | Medicine, Research & Experimental",NA,NA,CELL PRESS,NA +molecular vision,1090-0535,1090-0535,NA,0,0,1,0,Biochemistry & Molecular Biology | Ophthalmology,NA,NA,MOLECULAR VISION,NA +molecules,1420-3049,1420-3049,Molecules_MDPI,0,0,1,1,"Biochemistry & Molecular Biology | Chemistry, Multidisciplinary",NA,NA,MDPI,2014-05-15 +molecules and cells,1016-8478,0219-1032,KSMCBofficial,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,KOREAN SOC MOLECULAR & CELLULAR BIOLOGY,2021-05-31 +molluscan research,1323-5818,1448-6067,NA,0,0,1,0,Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +monatshefte fur chemie,0026-9247,1434-4475,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER WIEN,NA +monatshefte fur mathematik,0026-9255,1436-5081,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER WIEN,NA +monatsschrift fur kriminologie und strafrechtsreform,0026-9301,2366-1968,NA,0,1,0,0,NA,Criminology & Penology,NA,WALTER DE GRUYTER GMBH,NA +monatsschrift kinderheilkunde,0026-9298,1433-0474,NA,0,0,1,0,Pediatrics,NA,NA,SPRINGER,NA +monist,0026-9662,2153-3601,NA,1,0,0,0,NA,NA,Philosophy,OXFORD UNIV PRESS INC,NA +monographs of the society for research in child development,0037-976X,1540-5834,NA,0,1,0,0,NA,"Psychology, Development",NA,WILEY,NA +montana-the magazine of western history,0026-9891,2328-4293,NA,1,0,0,0,NA,NA,History,MONTANA HISTORICAL SOC,NA +monthly labor review,0098-1818,1937-4658,NA,0,1,0,0,NA,Industrial Relations & Labor,NA,LEGAL BOOKS DEPOT,NA +monthly notices of the royal astronomical society,0035-8711,1365-2966,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,OXFORD UNIV PRESS,NA +monthly review-an independent socialist magazine,0027-0520,0027-0520,monthly_review,0,1,0,1,NA,Political Science,NA,MONTHLY REVIEW FOUNDATION,2011-05-31 +monthly weather review,0027-0644,1520-0493,MonWeaRev,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,AMER METEOROLOGICAL SOC,2019-03-26 +monumenta nipponica,0027-0741,1880-1390,MonumentaNippon,1,0,0,1,NA,NA,Asian Studies,MONUMENTA NIPPONICA SOPHIA UNIV,2022-02-24 +moravian geographical reports,1210-8812,1210-8812,moravianreports,0,1,0,1,NA,Geography,NA,SCIENDO,2019-09-25 +mosaic-an interdisciplinary critical journal,0027-1276,1925-5683,MosaicAJournal,1,0,0,1,NA,NA,Literary Theory & Criticism | Literature,UNIV MANITOBA,2018-04-01 +moscow mathematical journal,1609-3321,1609-4514,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,INDEPENDENT UNIV MOSCOW-IUM,NA +moscow university physics bulletin,0027-1349,1934-8460,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,PLEIADES PUBLISHING INC,NA +motivation and emotion,0146-7239,1573-6644,Mot_Emo,0,1,0,1,NA,"Psychology, Experimental | Psychology, Social",NA,SPRINGER/PLENUM PUBLISHERS,2021-02-27 +motivation science,2333-8113,2333-8121,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +motor control,1087-1640,1543-2696,MotorControlHK,0,0,1,1,Neurosciences | Sport Sciences,NA,NA,HUMAN KINETICS PUBL INC,2020-12-14 +mountain research and development,0276-4741,1994-7151,NA,0,0,1,0,"Environmental Sciences | Geography, Physical",NA,NA,INT MOUNTAIN SOC,NA +mouvement social,0027-2671,1961-8646,revue_lms,1,1,0,1,NA,History,History,PRESSES SCIENCES PO,2013-07-21 +mouvement social,0027-2671,1961-8646,revue_lms,1,1,0,1,NA,History,History,EDITIONS OUVRIERES,2013-07-21 +movement disorders,0885-3185,1531-8257,MDJ_Journal,0,0,1,1,Clinical Neurology,NA,NA,WILEY,2020-07-01 +movement ecology,2051-3933,2051-3933,NA,0,0,1,0,Ecology,NA,NA,BMC,NA +movimento,0104-754X,1982-8918,revmovimento,0,1,0,1,NA,"Education & Educational Research | Social Sciences, Interdisciplinary",NA,"UNIV FED RIO GRANDE DO SUL, ESCOLA EDUC FISICA",2017-06-18 +moving image,1532-3978,1542-4235,NA,1,0,0,0,NA,NA,"Film, Radio, Television",UNIV MINNESOTA PRESS,NA +moyen age,0027-2841,1782-1436,RevueLeMoyenAge,1,0,0,1,NA,NA,Medieval & Renaissance Studies,LE MOYEN AGE BOECK & LARCIER S A,2020-02-03 +mrs bulletin,0883-7694,1938-1425,MRSBulletin,0,0,1,1,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,SPRINGER HEIDELBERG,2014-09-18 +mrs communications,2159-6859,2159-6867,MRS_Comms,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,SPRINGER HEIDELBERG,2015-01-14 +msphere,2379-5042,2379-5042,mSphereJ,0,0,1,1,Microbiology,NA,NA,AMER SOC MICROBIOLOGY,2015-06-01 +msystems,2379-5077,2379-5077,mSystemsJ,0,0,1,1,Microbiology,NA,NA,AMER SOC MICROBIOLOGY,2015-05-31 +mucosal immunology,1933-0219,1935-3456,MucosalImmunol,0,0,1,1,Immunology,NA,NA,SPRINGERNATURE,2017-07-19 +multibody system dynamics,1384-5640,1573-272X,NA,0,0,1,0,Mechanics,NA,NA,SPRINGER,NA +multidimensional systems and signal processing,0923-6082,1573-0824,NA,0,0,1,0,"Computer Science, Theory & Methods | Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +multilingua-journal of cross-cultural and interlanguage communication,0167-8507,1613-3684,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +multilingua-journal of cross-cultural and interlanguage communication,0167-8507,1613-3684,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +multimedia systems,0942-4962,1432-1882,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +multimedia tools and applications,1380-7501,1573-7721,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering | Computer Science, Theory & Methods | Engineering, Electrical & Electronic",NA,NA,SPRINGER,NA +multinational business review,1525-383X,2054-1686,NA,0,1,0,0,NA,Business,NA,EMERALD GROUP PUBLISHING LTD,NA +multiple sclerosis and related disorders,2211-0348,2211-0356,SclerosisAnd,0,0,1,1,Clinical Neurology,NA,NA,ELSEVIER SCI LTD,2019-11-16 +multiple sclerosis journal,1352-4585,1477-0970,MSJ_Research,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,SAGE PUBLICATIONS LTD,2016-08-12 +multiscale modeling & simulation,1540-3459,1540-3467,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Physics, Mathematical",NA,NA,SIAM PUBLICATIONS,NA +multisensory research,2213-4794,2213-4808,multisensoryres,0,1,1,1,Biophysics | Psychology,"Psychology, Experimental",NA,BRILL,2013-02-08 +multisensory research,2213-4794,2213-4808,multisensoryres,0,1,1,1,Biophysics | Psychology,"Psychology, Experimental",NA,BRILL,2013-02-08 +multivariate behavioral research,0027-3171,1532-7906,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Social Sciences, Mathematical Methods | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +multivariate behavioral research,0027-3171,1532-7906,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Social Sciences, Mathematical Methods | Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +muqarnas,0732-2992,2211-8993,NA,1,0,0,0,NA,NA,Architecture | Art,BRILL,NA +muscle & nerve,0148-639X,1097-4598,MuscleAndNerve,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,WILEY,2017-09-28 +musculoskeletal science and practice,2468-7812,2468-7812,NA,0,0,1,0,Rehabilitation,NA,NA,ELSEVIER,NA +museon,0771-6494,1783-158X,NA,1,0,0,0,NA,NA,"Asian Studies | Humanities, Multidisciplinary",PEETERS,NA +museum international,1350-0775,1468-0033,NA,1,0,0,0,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +museum management and curatorship,0964-7775,1872-9185,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +music & letters,0027-4224,1477-4631,NA,1,0,0,0,NA,NA,Music,OXFORD UNIV PRESS,NA +music analysis,0262-5245,1468-2249,NA,1,0,0,0,NA,NA,Music,WILEY,NA +music education research,1461-3808,1469-9893,NA,1,1,0,0,NA,Education & Educational Research,Music,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +music education research,1461-3808,1469-9893,NA,1,1,0,0,NA,Education & Educational Research,Music,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +music perception,0730-7829,1533-8312,NA,1,1,0,0,NA,"Psychology, Experimental",Music,UNIV CALIFORNIA PRESS,NA +music perception,0730-7829,1533-8312,NA,1,1,0,0,NA,"Psychology, Experimental",Music,UNIV CALIFORNIA PRESS,NA +music theory online,1067-3040,1067-3040,MTOJournal,1,0,0,1,NA,NA,Music,SOC FOR MUSIC THEORY,2013-08-29 +music theory spectrum,0195-6167,1533-8339,NA,1,0,0,0,NA,NA,Music,OXFORD UNIV PRESS INC,NA +musica hodie,1676-3939,1676-3939,NA,1,0,0,0,NA,NA,Music,UNIV FEDERAL GOIAS,NA +musicae scientiae,1029-8649,2045-4147,NA,1,1,0,0,NA,"Psychology, Experimental",Music,SAGE PUBLICATIONS LTD,NA +musicae scientiae,1029-8649,2045-4147,NA,1,1,0,0,NA,"Psychology, Experimental",Music,SAGE PUBLICATIONS LTD,NA +musical quarterly,0027-4631,1741-8399,NA,1,0,0,0,NA,NA,Music,OXFORD UNIV PRESS INC,NA +musical times,0027-4666,NA,NA,1,0,0,0,NA,NA,Music,MUSICAL TIMES PUBLICATIONS LTD,NA +musik in bayern,0937-583X,NA,NA,1,0,0,0,NA,NA,Music,HANS SCHNEIDER,NA +musik und kirche,0027-4771,2568-3128,NA,1,0,0,0,NA,NA,Music,BARENREITER-VERLAG,NA +musikforschung,0027-4801,NA,NA,1,0,0,0,NA,NA,Music,NEUWERK-BUCH UND MUSIKALIENHANDLUNG,NA +musiktheorie,0177-4182,NA,NA,1,0,0,0,NA,NA,Music,LAABER-VERLAG,NA +muslim world,0027-4909,1478-1913,NA,1,0,0,0,NA,NA,Religion | Asian Studies,WILEY,NA +mutagenesis,0267-8357,1464-3804,NA,0,0,1,0,Genetics & Heredity | Toxicology,NA,NA,OXFORD UNIV PRESS,NA +mutation research-fundamental and molecular mechanisms of mutagenesis,0027-5107,1873-135X,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity | Toxicology,NA,NA,ELSEVIER,NA +mutation research-genetic toxicology and environmental mutagenesis,1383-5718,1879-3592,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity | Toxicology,NA,NA,ELSEVIER,NA +mutation research-reviews in mutation research,1383-5742,1388-2139,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity | Toxicology,NA,NA,ELSEVIER,NA +muttersprache,0027-514X,NA,NA,1,0,0,0,NA,NA,Language & Linguistics,GESELLSCHAFT DEUTSCHE SPRACHE,NA +muzikoloski zbornik,0580-373X,2350-4242,NA,1,0,0,0,NA,NA,Music,UNIV LJUBLJANI ODDELEK MUSIKOLOGIJO,NA +mycobiology,1229-8093,2092-9323,NA,0,0,1,0,Agronomy | Mycology,NA,NA,TAYLOR & FRANCIS LTD,NA +mycokeys,1314-4057,1314-4049,MycoKeys,0,0,1,1,Mycology,NA,NA,PENSOFT PUBLISHERS,2011-07-13 +mycologia,0027-5514,1557-2536,NA,0,0,1,0,Mycology,NA,NA,TAYLOR & FRANCIS INC,NA +mycological progress,1617-416X,1861-8952,NA,0,0,1,0,Mycology,NA,NA,SPRINGER HEIDELBERG,NA +mycopathologia,0301-486X,1573-0832,NA,0,0,1,0,Mycology,NA,NA,SPRINGER,NA +mycorrhiza,0940-6360,1432-1890,NA,0,0,1,0,Plant Sciences | Mycology,NA,NA,SPRINGER,NA +mycoscience,1340-3540,1618-2545,NA,0,0,1,0,Mycology,NA,NA,MYCOLOGICAL SOC JAPAN,NA +mycoses,0933-7407,1439-0507,NA,0,0,1,0,Dermatology | Mycology,NA,NA,WILEY,NA +mycosphere,2077-7000,2077-7000,NA,0,0,1,0,Mycology,NA,NA,MYCOSPHERE PRESS,NA +mycotaxon,0093-4666,0093-4666,NA,0,0,1,0,Mycology,NA,NA,MYCOTAXON LTD,NA +mycotoxin research,0178-7888,1867-1632,Mycotoxin_Res,0,0,1,1,Mycology | Toxicology,NA,NA,SPRINGER HEIDELBERG,2019-08-16 +myrmecological news,1994-4136,1994-4136,MyrmecolNews,0,0,1,1,Entomology,NA,NA,"OESTERREICHISCHE GESELL ENTOMOFAUNISTIK, C/O NATURHISTOR MUSEUM WIEN",2018-04-06 +nagoya journal of medical science,2186-3326,0027-7622,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,"NAGOYA UNIV, SCH MED",NA +nagoya mathematical journal,0027-7630,2152-6842,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +names-a journal of onomastics,0027-7738,1756-2279,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"UNIV PITTSBURGH, UNIV LIBRARY SYSTEM",NA +names-a journal of onomastics,0027-7738,1756-2279,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"UNIV PITTSBURGH, UNIV LIBRARY SYSTEM",NA +nan nu-men women and gender in china,1387-6805,1568-5268,NA,1,0,0,0,NA,NA,Asian Studies,BRILL,NA +nano,1793-2920,1793-7094,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +nano-micro letters,2311-6706,2150-5551,nmletters,0,0,1,1,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,SHANGHAI JIAO TONG UNIV PRESS,2016-01-07 +nano communication networks,1878-7789,1878-7797,NA,0,0,1,0,"Engineering, Electrical & Electronic | Nanoscience & Nanotechnology | Telecommunications",NA,NA,ELSEVIER,NA +nano convergence,2196-5404,2196-5404,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,SPRINGER,NA +nano energy,2211-2855,2211-3282,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER,NA +nano futures,2399-1984,2399-1984,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +nano letters,1530-6984,1530-6992,NanoLetters,0,0,1,1,"Chemistry, Multidisciplinary | Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,AMER CHEMICAL SOC,2009-03-05 +nano research,1998-0124,1998-0000,research_nano,0,0,1,1,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,TSINGHUA UNIV PRESS,2018-07-23 +nano today,1748-0132,1878-044X,NA,0,0,1,0,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +nanocomposites,2055-0324,2055-0332,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Composites",NA,NA,TAYLOR & FRANCIS LTD,NA +nanoethics,1871-4757,1871-4765,NA,0,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science | Ethics,NA,SPRINGER,NA +nanoethics,1871-4757,1871-4765,NA,0,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science | Ethics,NA,SPRINGER,NA +nanoimpact,2452-0748,2452-0748,NA,0,0,1,0,Environmental Sciences | Nanoscience & Nanotechnology,NA,NA,ELSEVIER,NA +nanomaterials,2079-4991,2079-4991,Nano_MDPI,0,0,1,1,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,MDPI,2016-12-26 +nanomaterials and nanotechnology,1847-9804,1847-9804,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,SAGE PUBLICATIONS LTD,NA +nanomedicine,1743-5889,1748-6963,fsgnnm,0,0,1,1,Biotechnology & Applied Microbiology | Nanoscience & Nanotechnology,NA,NA,FUTURE MEDICINE LTD,2014-07-22 +nanomedicine-nanotechnology biology and medicine,1549-9634,1549-9642,NA,0,0,1,0,"Nanoscience & Nanotechnology | Medicine, Research & Experimental",NA,NA,ELSEVIER,NA +nanophotonics,2192-8606,2192-8614,Nanophotonics_J,0,0,1,1,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Optics | Physics, Applied",NA,NA,WALTER DE GRUYTER GMBH,2013-03-08 +nanoscale,2040-3364,2040-3372,NA,0,0,1,0,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ROYAL SOC CHEMISTRY,NA +nanoscale advances,2516-0230,2516-0230,NA,0,0,1,0,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,NA +nanoscale and microscale thermophysical engineering,1556-7265,1556-7273,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical | Nanoscience & Nanotechnology | Materials Science, Characterization, Testing | Physics, Applied",NA,NA,TAYLOR & FRANCIS INC,NA +nanoscale horizons,2055-6756,2055-6764,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,NA +nanoscale research letters,1931-7573,1556-276X,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,SPRINGER,NA +nanotechnology,0957-4484,1361-6528,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,IOP PUBLISHING LTD,NA +nanotechnology reviews,2191-9089,2191-9097,NA,0,0,1,0,"Chemistry, Multidisciplinary | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,WALTER DE GRUYTER GMBH,NA +nanotoxicology,1743-5390,1743-5404,NA,0,0,1,0,Nanoscience & Nanotechnology | Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +narrative,1063-3685,1538-974X,NarrativeMag,1,0,0,1,NA,NA,Literature,OHIO STATE UNIV PRESS,2009-02-10 +narrative inquiry,1387-6740,1569-9935,NA,1,1,0,0,NA,Communication | Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +narrative inquiry,1387-6740,1569-9935,NA,1,1,0,0,NA,Communication | Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +nation,0027-8378,0027-8378,the_nation,0,1,0,1,NA,Political Science,NA,"NATION CO INC",2008-05-10 +national academy science letters-india,0250-541X,2250-1754,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,SPRINGER INDIA,NA +national medical journal of india,0970-258X,0970-258X,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +national science review,2095-5138,2053-714X,NSR_Family,0,0,1,1,Multidisciplinary Sciences,NA,NA,OXFORD UNIV PRESS,2009-09-05 +national tax journal,0028-0283,1944-7477,JournalTax,0,1,0,1,NA,"Business, Finance | Economics",NA,UNIV CHICAGO PRESS,2019-03-08 +nationalities papers-the journal of nationalism and ethnicity,0090-5992,1465-3923,NationalitiesP,0,1,0,1,NA,Area Studies | Ethnic Studies | History | Political Science,NA,CAMBRIDGE UNIV PRESS,2017-05-06 +nations and nationalism,1354-5078,1469-8129,n_nationalism,0,1,0,1,NA,Ethnic Studies | History | Political Science | Sociology,NA,WILEY,2015-06-29 +natural areas journal,0885-8608,2162-4399,NA,0,0,1,0,Ecology | Forestry,NA,NA,"NATURAL AREAS ASSOC",NA +natural computing,1567-7818,1572-9796,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +natural hazards,0921-030X,1573-0840,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Water Resources",NA,NA,SPRINGER,NA +natural hazards and earth system sciences,1561-8633,1684-9981,EGU_NHESS,0,0,1,1,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Water Resources",NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-14 +natural hazards review,1527-6988,1527-6996,NA,0,1,1,0,"Engineering, Civil | Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Water Resources",Environmental Studies,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +natural hazards review,1527-6988,1527-6996,NA,0,1,1,0,"Engineering, Civil | Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Water Resources",Environmental Studies,NA,ASCE-AMER SOC CIVIL ENGINEERS,NA +natural history,0028-0712,NA,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,"NATURAL HISTORY MAGAZINE",NA +natural language & linguistic theory,0167-806X,1573-0859,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SPRINGER,NA +natural language & linguistic theory,0167-806X,1573-0859,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,SPRINGER,NA +natural language engineering,1351-3249,1469-8110,Journal_NLE,1,1,1,1,"Computer Science, Artificial Intelligence",Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,2014-05-23 +natural language engineering,1351-3249,1469-8110,Journal_NLE,1,1,1,1,"Computer Science, Artificial Intelligence",Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,2014-05-23 +natural language engineering,1351-3249,1469-8110,Journal_NLE,1,1,1,1,"Computer Science, Artificial Intelligence",Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,2014-05-23 +natural language semantics,0925-854X,1572-865X,NLS_editors,1,1,0,1,NA,Linguistics,Language & Linguistics,SPRINGER,2022-04-02 +natural language semantics,0925-854X,1572-865X,NLS_editors,1,1,0,1,NA,Linguistics,Language & Linguistics,SPRINGER,2022-04-02 +natural product communications,1934-578X,1555-9475,NA,0,0,1,0,"Chemistry, Medicinal | Food Science & Technology",NA,NA,SAGE PUBLICATIONS INC,NA +natural product reports,0265-0568,1460-4752,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Medicinal | Chemistry, Organic",NA,NA,ROYAL SOC CHEMISTRY,NA +natural product research,1478-6419,1478-6427,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Medicinal",NA,NA,TAYLOR & FRANCIS LTD,NA +natural resource modeling,0890-8575,1939-7445,NA,0,0,1,0,"Environmental Sciences | Mathematics, Interdisciplinary Applications",NA,NA,WILEY,NA +natural resources forum,0165-0203,1477-8947,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,WILEY,NA +natural resources forum,0165-0203,1477-8947,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,WILEY,NA +natural resources journal,0028-0739,0028-0739,NA,0,1,0,0,NA,Environmental Studies | Law,NA,"UNIV NEW MEXICO, SCH LAW",NA +natural resources research,1520-7439,1573-8981,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SPRINGER,NA +nature,0028-0836,1476-4687,Nature,0,0,1,1,Multidisciplinary Sciences,NA,NA,"NATURE PORTFOLIO",2008-08-15 +nature + culture,1558-6073,1558-5468,natcult_net,0,1,0,1,NA,Environmental Studies,NA,BERGHAHN JOURNALS,2018-11-22 +nature and science of sleep,1179-1608,1179-1608,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,DOVE MEDICAL PRESS LTD,NA +nature astronomy,2397-3366,2397-3366,NatureAstronomy,0,0,1,1,Astronomy & Astrophysics,NA,NA,"NATURE PORTFOLIO",2015-10-01 +nature biomedical engineering,2157-846X,2157-846X,natBME,0,0,1,1,"Engineering, Biomedical",NA,NA,"NATURE PORTFOLIO",2016-01-23 +nature biotechnology,1087-0156,1546-1696,NatureBiotech,0,0,1,1,Biotechnology & Applied Microbiology,NA,NA,"NATURE PORTFOLIO",2009-06-03 +nature catalysis,2520-1158,2520-1158,NatureCatalysis,0,0,1,1,"Chemistry, Physical",NA,NA,"NATURE PORTFOLIO",2017-03-04 +nature cell biology,1465-7392,1476-4679,NatureCellBio,0,0,1,1,Cell Biology,NA,NA,"NATURE PORTFOLIO",2010-02-04 +nature chemical biology,1552-4450,1552-4469,nchembio,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,"NATURE PORTFOLIO",2009-03-19 +nature chemistry,1755-4330,1755-4349,NatureChemistry,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2009-03-10 +nature climate change,1758-678X,1758-6798,NatureClimate,0,1,1,1,Environmental Sciences | Meteorology & Atmospheric Sciences,Environmental Studies,NA,"NATURE PORTFOLIO",2010-07-07 +nature climate change,1758-678X,1758-6798,NatureClimate,0,1,1,1,Environmental Sciences | Meteorology & Atmospheric Sciences,Environmental Studies,NA,"NATURE PORTFOLIO",2010-07-07 +nature communications,2041-1723,2041-1723,NatureComms,0,0,1,1,Multidisciplinary Sciences,NA,NA,"NATURE PORTFOLIO",2010-10-22 +nature conservation-bulgaria,1314-6947,1314-3301,naturecons,0,0,1,1,Biodiversity Conservation,NA,NA,PENSOFT PUBLISHERS,2011-04-09 +nature ecology & evolution,2397-334X,2397-334X,nature electronics,0,0,1,1,Ecology | Evolutionary Biology,NA,NA,"NATURE PORTFOLIO",2018-08-26 +nature electronics,2520-1131,2520-1131,NatureElectron,0,0,1,1,"Engineering, Electrical & Electronic",NA,NA,"NATURE PORTFOLIO",2017-03-13 +nature energy,2058-7546,2058-7546,NatureEnergyJnl,0,0,1,1,"Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2015-04-07 +nature genetics,1061-4036,1546-1718,NatureGenet,0,0,1,1,Genetics & Heredity,NA,NA,"NATURE PORTFOLIO",2015-01-15 +nature geoscience,1752-0894,1752-0908,NatureGeosci,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2011-02-07 +nature human behaviour,2397-3374,2397-3374,NatureHumBehav,0,1,1,1,Multidisciplinary Sciences | Neurosciences,"Psychology, Experimental",NA,"NATURE PORTFOLIO",2016-03-07 +nature human behaviour,2397-3374,2397-3374,NatureHumBehav,0,1,1,1,Multidisciplinary Sciences | Neurosciences,"Psychology, Experimental",NA,"NATURE PORTFOLIO",2016-03-07 +nature immunology,1529-2908,1529-2916,NatImmunol,0,0,1,1,Immunology,NA,NA,"NATURE PORTFOLIO",2015-08-11 +nature machine intelligence,2522-5839,2522-5839,NatMachIntell,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",NA,NA,"NATURE PORTFOLIO",2017-11-20 +nature materials,1476-1122,1476-4660,NatureMaterials,0,0,1,1,"Chemistry, Physical | Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,"NATURE PORTFOLIO",2009-02-16 +nature medicine,1078-8956,1546-170X,NatureMedicine,0,0,1,1,"Biochemistry & Molecular Biology | Cell Biology | Medicine, Research & Experimental",NA,NA,"NATURE PORTFOLIO",2009-03-26 +nature metabolism,2522-5812,2522-5812,NatMetabolism,0,0,1,1,Endocrinology & Metabolism,NA,NA,"NATURE PORTFOLIO",2017-12-04 +nature methods,1548-7091,1548-7105,naturemethods,0,0,1,1,Biochemical Research Methods,NA,NA,"NATURE PORTFOLIO",2011-03-11 +nature microbiology,2058-5276,2058-5276,NatureMicrobiol,0,0,1,1,Microbiology,NA,NA,"NATURE PORTFOLIO",2015-02-25 +nature nanotechnology,1748-3387,1748-3395,NatureNano,0,0,1,1,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2010-10-29 +nature neuroscience,1097-6256,1546-1726,NatureNeuro,0,0,1,1,Neurosciences,NA,NA,"NATURE PORTFOLIO",2013-01-11 +nature photonics,1749-4885,1749-4893,NaturePhotonics,0,0,1,1,"Optics | Physics, Applied",NA,NA,"NATURE PORTFOLIO",2012-01-20 +nature physics,1745-2473,1745-2481,NaturePhysics,0,0,1,1,"Physics, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2009-08-20 +nature plants,2055-026X,2055-0278,NaturePlants,0,0,1,1,Plant Sciences,NA,NA,"NATURE PORTFOLIO",2014-04-14 +nature protocols,1754-2189,1750-2799,NatureProtocols,0,0,1,1,Biochemical Research Methods,NA,NA,"NATURE PORTFOLIO",2009-03-26 +nature reviews cancer,1474-175X,1474-1768,NatureRevCancer,0,0,1,1,Oncology,NA,NA,"NATURE PORTFOLIO",2011-11-07 +nature reviews cardiology,1759-5002,1759-5010,NatRevCardiol,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,"NATURE PORTFOLIO",2011-11-08 +nature reviews chemistry,2397-3358,2397-3358,NatRevChem,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2015-09-18 +nature reviews clinical oncology,1759-4774,1759-4782,NatRevClinOncol,0,0,1,1,Oncology,NA,NA,"NATURE PORTFOLIO",2011-08-02 +nature reviews disease primers,2056-676X,2056-676X,DiseasePrimers,0,0,1,1,"Medicine, General & Internal",NA,NA,"NATURE PORTFOLIO",2014-10-10 +nature reviews drug discovery,1474-1776,1474-1784,NatRevDrugDisc,0,0,1,1,Biotechnology & Applied Microbiology | Pharmacology & Pharmacy,NA,NA,"NATURE PORTFOLIO",2009-04-28 +nature reviews earth & environment,2662-138X,2662-138X,NatRevEarthEnv,0,0,1,1,"Environmental Sciences | Geosciences, Multidisciplinary",NA,NA,SPRINGERNATURE,2018-10-21 +nature reviews endocrinology,1759-5029,1759-5037,NatureRevEndo,0,0,1,1,Endocrinology & Metabolism,NA,NA,"NATURE PORTFOLIO",2010-10-06 +nature reviews gastroenterology & hepatology,1759-5045,1759-5053,NatRevGastroHep,0,0,1,1,Gastroenterology & Hepatology,NA,NA,"NATURE PORTFOLIO",2011-10-25 +nature reviews genetics,1471-0056,1471-0064,NatureRevGenet,0,0,1,1,Genetics & Heredity,NA,NA,"NATURE PORTFOLIO",2009-09-03 +nature reviews immunology,1474-1733,1474-1741,NatRevImmunol,0,0,1,1,Immunology,NA,NA,"NATURE PORTFOLIO",2011-02-02 +nature reviews materials,2058-8437,2058-8437,NatRevMater,0,0,1,1,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2015-03-12 +nature reviews microbiology,1740-1526,1740-1534,NatureRevMicro,0,0,1,1,Microbiology,NA,NA,"NATURE PORTFOLIO",2009-11-05 +nature reviews molecular cell biology,1471-0072,1471-0080,NatRevMCB,0,0,1,1,Cell Biology,NA,NA,"NATURE PORTFOLIO",2011-11-15 +nature reviews nephrology,1759-5061,1759-507X,NatRevNeph,0,0,1,1,Urology & Nephrology,NA,NA,"NATURE PORTFOLIO",2011-11-08 +nature reviews neurology,1759-4758,1759-4766,NatRevNeurol,0,0,1,1,Clinical Neurology,NA,NA,"NATURE PORTFOLIO",2011-11-08 +nature reviews neuroscience,1471-003X,1471-0048,NatRevNeurosci,0,0,1,1,Neurosciences,NA,NA,"NATURE PORTFOLIO",2011-11-08 +nature reviews physics,2522-5820,2522-5820,NatRevPhys,0,0,1,1,"Physics, Applied | Physics, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2017-08-25 +nature reviews rheumatology,1759-4790,1759-4804,NatRevRheumatol,0,0,1,1,Rheumatology,NA,NA,"NATURE PORTFOLIO",2011-11-02 +nature reviews urology,1759-4812,1759-4820,NatRevUrol,0,0,1,1,Urology & Nephrology,NA,NA,"NATURE PORTFOLIO",2011-11-08 +nature structural & molecular biology,1545-9993,1545-9985,NatureSMB,0,0,1,1,Biochemistry & Molecular Biology | Biophysics | Cell Biology,NA,NA,"NATURE PORTFOLIO",2015-10-30 +nature sustainability,2398-9629,2398-9629,naturesustainab,0,1,1,1,Environmental Sciences,Green & Sustainable Science & Technology | Environmental Studies,NA,"NATURE PORTFOLIO",2015-02-26 +nature sustainability,2398-9629,2398-9629,naturesustainab,0,1,1,1,Environmental Sciences,Green & Sustainable Science & Technology | Environmental Studies,NA,"NATURE PORTFOLIO",2015-02-26 +naunyn-schmiedebergs archives of pharmacology,0028-1298,1432-1912,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGER,NA +nauplius,0104-6497,2358-2936,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,SOC BRASILEIRA CARCINOLOGIA,NA +nautilus,0028-1344,0028-1344,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,BAILEY-MATTHEWS SHELL MUSEUM,NA +naval engineers journal,0028-1425,1559-3584,NA,0,0,1,0,"Engineering, Marine | Engineering, Civil | Oceanography",NA,NA,AMER SOC NAVAL ENG INC,NA +naval research logistics,0894-069X,1520-6750,NA,0,0,1,0,Operations Research & Management Science,NA,NA,WILEY,NA +navigation-journal of the institute of navigation,0028-1522,2161-4296,NA,0,0,1,0,"Engineering, Aerospace | Remote Sensing | Telecommunications",NA,NA,"WILEY PERIODICALS, INC",NA +nber macroeconomics annual,0889-3365,1537-2642,NA,0,1,0,0,NA,Economics,NA,UNIV CHICAGO PRESS,NA +ndt & e international,0963-8695,1879-1174,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,ELSEVIER SCI LTD,NA +near eastern archaeology,1094-2076,2325-5404,NA,1,0,0,0,NA,NA,Archaeology,UNIV CHICAGO PRESS,NA +near surface geophysics,1569-4445,1873-0604,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,WILEY,NA +nebraska symposium on motivation,0146-7875,NA,NA,0,1,0,0,NA,"Psychology, Social",NA,SPRINGER,NA +nefrologia,0211-6995,1989-2284,NA,0,0,1,0,Urology & Nephrology,NA,NA,SOC ESPANOLA NEFROLOGIA DR RAFAEL MATESANZ,NA +negotiation and conflict management research,1750-4708,1750-4716,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,IACM-NCMR-INT ASSOC CONFLICT MANAGEMENT,NA +negotiation journal,0748-4526,1571-9979,NA,0,1,0,0,NA,"Management | Social Sciences, Interdisciplinary",NA,WILEY,NA +nematology,1388-5545,1388-5545,NA,0,0,1,0,Zoology,NA,NA,BRILL,NA +nematropica,0099-5444,2220-5608,neobiota,0,0,1,1,Zoology,NA,NA,ORGANIZATION TROP AMER NEMATOLOGISTS,2009-05-26 +neobiota,1619-0033,1314-2488,NeobiotaJournal,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,PENSOFT PUBLISHERS,2010-12-08 +neohelicon,0324-4652,1588-2810,NA,1,0,0,0,NA,NA,Literature,SPRINGER,NA +neonatology,1661-7800,1661-7819,NA,0,0,1,0,Pediatrics,NA,NA,KARGER,NA +neophilologus,0028-2677,1572-8668,neophilologus,1,0,0,1,NA,NA,Literature | Language & Linguistics,SPRINGER,2018-02-10 +neoplasia,1476-5586,1476-5586,NA,0,0,1,0,Oncology,NA,NA,ELSEVIER SCIENCE INC,NA +neoplasma,0028-2685,1338-4317,NA,0,0,1,0,Oncology,NA,NA,AEPRESS SRO,NA +neotestamentica,0254-8356,2518-4628,NA,1,0,0,0,NA,NA,Religion,NEW TESTAMENT SOC SOUTHERN AFRICA,NA +neotropical entomology,1519-566X,1678-8052,Neotrop_Entomol,0,0,1,1,Entomology,NA,NA,ENTOMOLOGICAL SOC BRASIL,2021-06-11 +neotropical ichthyology,1679-6225,1982-0224,Neotropi,0,0,1,1,Zoology,NA,NA,SOC BRASILEIRA ICTIOLOGIA,2014-09-15 +nephrologie & therapeutique,1769-7255,1872-9177,NephrolTherap,0,0,1,1,Urology & Nephrology,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",2020-12-21 +nephrology,1320-5358,1440-1797,NephrologyJ,0,0,1,1,Urology & Nephrology,NA,NA,WILEY,2018-09-17 +nephrology dialysis transplantation,0931-0509,1460-2385,NDTsocial,0,0,1,1,Transplantation | Urology & Nephrology,NA,NA,OXFORD UNIV PRESS,2015-10-16 +nephrology nursing journal,1526-744X,2163-5390,NNJOnline,0,1,1,1,Nursing | Urology & Nephrology,Nursing,NA,"JANNETTI PUBLICATIONS, INC",2019-12-19 +nephrology nursing journal,1526-744X,2163-5390,NNJOnline,0,1,1,1,Nursing | Urology & Nephrology,Nursing,NA,"JANNETTI PUBLICATIONS, INC",2019-12-19 +nephron,1660-8151,2235-3186,NA,0,0,1,0,Urology & Nephrology,NA,NA,KARGER,NA +nervenarzt,0028-2804,1433-0407,NA,0,0,1,0,Clinical Neurology | Psychiatry,NA,NA,SPRINGER,NA +netherlands heart journal,1568-5888,1876-6250,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,BOHN STAFLEU VAN LOGHUM BV,NA +netherlands journal of geosciences-geologie en mijnbouw,0016-7746,1573-9708,NLJ_Geosciences,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,2021-02-18 +netherlands journal of medicine,0300-2977,1872-9061,njmonline,0,0,1,1,"Medicine, General & Internal",NA,NA,VAN ZUIDEN COMMUNICATIONS,2015-01-28 +netherlands quarterly of human rights,0924-0519,2214-7357,thenqhr,0,1,0,1,NA,Law,NA,SAGE PUBLICATIONS INC,2019-02-25 +netherlands yearbook for history of art-nederlands kunsthistorisch jaarboek,0169-6726,2214-5966,NA,1,0,0,0,NA,NA,Art,BRILL,NA +network-computation in neural systems,0954-898X,1361-6536,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic | Neurosciences",NA,NA,TAYLOR & FRANCIS INC,NA +network neuroscience,2472-1751,2472-1751,netneurosci,0,0,1,1,Neurosciences,NA,NA,MIT PRESS,2016-07-26 +networks,0028-3045,1097-0037,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Operations Research & Management Science",NA,NA,WILEY,NA +networks & spatial economics,1566-113X,1572-9427,NA,0,0,1,0,Operations Research & Management Science | Transportation Science & Technology,NA,NA,SPRINGER,NA +networks and heterogeneous media,1556-1801,1556-181X,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications",NA,NA,AMER INST MATHEMATICAL SCIENCES-AIMS,NA +neue rundschau,0028-3347,NA,NA,1,0,0,0,NA,NA,Literary Reviews,S FISCHER VERLAG GMBH,NA +neue zeitschrift fur musik,0945-6945,NA,NA,1,0,0,0,NA,NA,Music,SCHOTT MUSIC GMBH & CO KG,NA +neue zeitschrift fur systematische theologie und religionsphilosophie,0028-3517,1612-9520,NA,1,0,0,0,NA,NA,Philosophy | Religion,WALTER DE GRUYTER GMBH,NA +neues jahrbuch fur geologie und palaontologie-abhandlungen,0077-7749,0077-7749,NA,0,0,1,0,Paleontology,NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +neues jahrbuch fur mineralogie-abhandlungen,0077-7757,0077-7757,NA,0,0,1,0,Mineralogy,NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +neuphilologische mitteilungen,0028-3754,NA,NA,1,0,0,0,NA,NA,Language & Linguistics,MODERN LANGUAGE SOC,NA +neural computation,0899-7667,1530-888X,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Neurosciences",NA,NA,MIT PRESS,NA +neural computing & applications,0941-0643,1433-3058,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER LONDON LTD,NA +neural development,1749-8104,1749-8104,NA,0,0,1,0,Developmental Biology | Neurosciences,NA,NA,BMC,NA +neural network world,1210-0552,2336-4335,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,"ACAD SCIENCES CZECH REPUBLIC, INST COMPUTER SCIENCE",NA +neural networks,0893-6080,1879-2782,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Neurosciences",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neural plasticity,2090-5904,1687-5443,NA,0,0,1,0,Neurosciences,NA,NA,HINDAWI LTD,NA +neural processing letters,1370-4621,1573-773X,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER,NA +neural regeneration research,1673-5374,1876-7958,NRRNeural,0,0,1,1,Cell Biology | Neurosciences,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2017-06-20 +neuro-oncology,1522-8517,1523-5866,NA,0,0,1,0,Oncology | Clinical Neurology,NA,NA,OXFORD UNIV PRESS INC,NA +neurobiology of aging,0197-4580,1558-1497,NA,0,0,1,0,Geriatrics & Gerontology | Neurosciences,NA,NA,ELSEVIER SCIENCE INC,NA +neurobiology of disease,0969-9961,1095-953X,NA,0,0,1,0,Neurosciences,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +neurobiology of learning and memory,1074-7427,1095-9564,NA,0,1,1,0,Behavioral Sciences | Neurosciences | Psychology,"Psychology, Multidisciplinary",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +neurobiology of learning and memory,1074-7427,1095-9564,NA,0,1,1,0,Behavioral Sciences | Neurosciences | Psychology,"Psychology, Multidisciplinary",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +neurobiology of stress,2352-2895,2352-2895,NA,0,0,1,0,Neurosciences,NA,NA,ELSEVIER SCIENCE INC,NA +neurocase,1355-4794,1465-3656,NA,0,0,1,0,Clinical Neurology | Psychiatry | Psychology,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +neurochemical journal,1819-7124,1819-7132,NA,0,0,1,0,Neurosciences,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +neurochemical research,0364-3190,1573-6903,NA,0,0,1,0,Biochemistry & Molecular Biology | Neurosciences,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +neurochemistry international,0197-0186,1872-9754,NA,0,0,1,0,Biochemistry & Molecular Biology | Neurosciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neurochirurgie,0028-3770,1773-0619,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,MASSON EDITEUR,NA +neurocirugia,1130-1473,2340-6305,NA,0,0,1,0,Neurosciences | Surgery,NA,NA,ELSEVIER ESPANA SLU,NA +neurocomputing,0925-2312,1872-8286,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,ELSEVIER,NA +neurocritical care,1541-6933,1556-0961,NeurocritCareJ,0,0,1,1,Critical Care Medicine | Clinical Neurology,NA,NA,HUMANA PRESS INC,2016-06-23 +neurodegenerative diseases,1660-2854,1660-2862,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,KARGER,NA +neuroendocrinology,0028-3835,1423-0194,NA,0,0,1,0,Endocrinology & Metabolism | Neurosciences,NA,NA,KARGER,NA +neuroendocrinology letters,0172-780X,2354-4716,NA,0,0,1,0,Endocrinology & Metabolism | Neurosciences,NA,NA,MAGHIRA & MAAS PUBLICATIONS,NA +neuroepidemiology,0251-5350,1423-0208,NA,0,0,1,0,"Public, Environmental & Occupational Health | Clinical Neurology",NA,NA,KARGER,NA +neuroethics,1874-5490,1874-5504,NeuroethicsJ,0,1,1,1,Medical Ethics,"Ethics | Social Sciences, Biomedical",NA,SPRINGER,2021-06-15 +neuroethics,1874-5490,1874-5504,NeuroethicsJ,0,1,1,1,Medical Ethics,"Ethics | Social Sciences, Biomedical",NA,SPRINGER,2021-06-15 +neurogastroenterology and motility,1350-1925,1365-2982,NA,0,0,1,0,Gastroenterology & Hepatology | Clinical Neurology | Neurosciences,NA,NA,WILEY,NA +neurogenetics,1364-6745,1364-6753,NA,0,0,1,0,Genetics & Heredity | Clinical Neurology,NA,NA,SPRINGER,NA +neuroimage,1053-8119,1095-9572,NeuroImage_EiC,0,0,1,1,"Neurosciences | Neuroimaging | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2018-01-03 +neuroimage-clinical,2213-1582,2213-1582,eic_nic,0,0,1,1,Neuroimaging,NA,NA,ELSEVIER SCI LTD,2020-01-16 +neuroimaging clinics of north america,1052-5149,1557-9867,NA,0,0,1,0,"Neurosciences | Neuroimaging | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +neuroimmunomodulation,1021-7401,1423-0216,NA,0,0,1,0,Endocrinology & Metabolism | Immunology | Neurosciences,NA,NA,KARGER,NA +neuroinformatics,1539-2791,1559-0089,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Neurosciences",NA,NA,HUMANA PRESS INC,NA +neurologia,0213-4853,1578-1968,RevisNeurologia,0,0,1,1,Clinical Neurology,NA,NA,ELSEVIER ESPANA SLU,2013-09-12 +neurologia i neurochirurgia polska,0028-3843,1897-4260,NA,0,0,1,0,Clinical Neurology,NA,NA,VIA MEDICA,NA +neurologia medico-chirurgica,0470-8105,1349-8029,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,JAPAN NEUROSURGICAL SOC,NA +neurologic clinics,0733-8619,1557-9875,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +neurological research,0161-6412,1743-1328,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,TAYLOR & FRANCIS LTD,NA +neurological sciences,1590-1874,1590-3478,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +neurological sciences and neurophysiology,2636-865X,2636-865X,NeurophysNsn,0,0,1,1,Neurosciences,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2020-12-08 +neurologist,1074-7931,2331-2637,NA,0,0,1,0,Clinical Neurology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +neurology,0028-3878,1526-632X,GreenJournal,0,0,1,1,Clinical Neurology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2009-07-23 +neurology-genetics,2376-7839,2376-7839,NA,0,0,1,0,Genetics & Heredity | Clinical Neurology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +neurology-neuroimmunology & neuroinflammation,2332-7812,2332-7812,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +neurology and therapy,2193-8253,2193-6536,Neurology_Ther,0,0,1,1,Clinical Neurology,NA,NA,SPRINGER LONDON LTD,2017-02-08 +neurology asia,1823-6138,NA,NA,0,0,1,0,Clinical Neurology,NA,NA,ASEAN NEUROLOGICAL ASSOC,NA +neurology india,0028-3886,1998-4022,IndiaNeurology,0,0,1,1,Neurosciences,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,2019-02-28 +neuromodulation,1094-7159,1525-1403,JNeuromod,0,0,1,1,"Medicine, Research & Experimental | Clinical Neurology",NA,NA,WILEY,2019-11-27 +neuromolecular medicine,1535-1084,1559-1174,NA,0,0,1,0,Neurosciences,NA,NA,HUMANA PRESS INC,NA +neuromuscular disorders,0960-8966,1873-2364,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neuron,0896-6273,1097-4199,NA,0,0,1,0,Neurosciences,NA,NA,CELL PRESS,NA +neuropathology,0919-6544,1440-1789,NA,0,0,1,0,Clinical Neurology | Neurosciences | Pathology,NA,NA,WILEY,NA +neuropathology and applied neurobiology,0305-1846,1365-2990,"NAN_Wiley",0,0,1,1,Clinical Neurology | Neurosciences | Pathology,NA,NA,WILEY,2013-10-29 +neuropediatrics,0174-304X,1439-1899,NA,0,0,1,0,Clinical Neurology | Pediatrics,NA,NA,GEORG THIEME VERLAG KG,NA +neuropeptides,0143-4179,1532-2785,NA,0,0,1,0,Endocrinology & Metabolism | Neurosciences,NA,NA,CHURCHILL LIVINGSTONE,NA +neuropharmacology,0028-3908,1873-7064,NA,0,0,1,0,Neurosciences | Pharmacology & Pharmacy,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neurophotonics,2329-423X,2329-4248,NA,0,0,1,0,Neurosciences | Optics,NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +neurophysiologie clinique-clinical neurophysiology,0987-7053,1769-7131,NA,0,0,1,0,Clinical Neurology | Neurosciences | Physiology,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +neurophysiology,0090-2977,1573-9007,NA,0,0,1,0,Neurosciences | Physiology,NA,NA,SPRINGER,NA +neuropsychiatric disease and treatment,1178-2021,1178-2021,NA,0,0,1,0,Clinical Neurology | Psychiatry,NA,NA,DOVE MEDICAL PRESS LTD,NA +neuropsychobiology,0302-282X,1423-0224,NA,0,0,1,0,Neurosciences | Psychiatry | Psychology,NA,NA,KARGER,NA +neuropsychologia,0028-3932,1873-3514,NA,0,1,1,0,Behavioral Sciences | Neurosciences,"Psychology, Experimental",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neuropsychologia,0028-3932,1873-3514,NA,0,1,1,0,Behavioral Sciences | Neurosciences,"Psychology, Experimental",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neuropsychological rehabilitation,0960-2011,1464-0694,NA,0,0,1,0,Neurosciences | Psychology,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +neuropsychology,0894-4105,1931-1559,NA,0,1,1,0,Neurosciences | Psychology,"Psychology, Clinical",NA,AMER PSYCHOLOGICAL ASSOC,NA +neuropsychology,0894-4105,1931-1559,NA,0,1,1,0,Neurosciences | Psychology,"Psychology, Clinical",NA,AMER PSYCHOLOGICAL ASSOC,NA +neuropsychology review,1040-7308,1573-6660,NA,0,1,1,0,Neurosciences,"Psychology, Clinical",NA,SPRINGER,NA +neuropsychology review,1040-7308,1573-6660,NA,0,1,1,0,Neurosciences,"Psychology, Clinical",NA,SPRINGER,NA +neuropsychopharmacology,0893-133X,1740-634X,npp_journal,0,0,1,1,Neurosciences | Pharmacology & Pharmacy | Psychiatry,NA,NA,SPRINGERNATURE,2017-02-07 +neuroradiology,0028-3940,1432-1920,NRADjournal,0,0,1,1,"Clinical Neurology | Neuroimaging | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,2016-05-12 +neurorehabilitation,1053-8135,1878-6448,NA,0,1,1,0,Clinical Neurology | Rehabilitation,Rehabilitation,NA,IOS PRESS,NA +neurorehabilitation,1053-8135,1878-6448,NA,0,1,1,0,Clinical Neurology | Rehabilitation,Rehabilitation,NA,IOS PRESS,NA +neurorehabilitation and neural repair,1545-9683,1552-6844,NA,0,0,1,0,Clinical Neurology | Rehabilitation,NA,NA,SAGE PUBLICATIONS INC,NA +neuroreport,0959-4965,1473-558X,NeuroReport,0,0,1,1,Neurosciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2012-02-03 +neuroscience,0306-4522,1873-7544,NA,0,0,1,0,Neurosciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neuroscience and biobehavioral reviews,0149-7634,1873-7528,NA,0,0,1,0,Behavioral Sciences | Neurosciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neuroscience bulletin,1673-7067,1995-8218,NA,0,0,1,0,Neurosciences,NA,NA,SPRINGER,NA +neuroscience letters,0304-3940,1872-7972,NA,0,0,1,0,Neurosciences,NA,NA,ELSEVIER IRELAND LTD,NA +neuroscience research,0168-0102,1872-8111,NA,0,0,1,0,Neurosciences,NA,NA,ELSEVIER IRELAND LTD,NA +neurosciences,1319-6138,1319-6138,NA,0,0,1,0,Clinical Neurology,NA,NA,RIYADH ARMED FORCES HOSPITAL,NA +neuroscientist,1073-8584,1089-4098,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,SAGE PUBLICATIONS INC,NA +neurospine,2586-6583,2586-6591,NeurospineJ,0,0,1,1,Clinical Neurology | Surgery,NA,NA,KOREAN SPINAL NEUROSURGERY SOC,2019-11-16 +neurosurgery,0148-396X,1524-4040,NeurosurgeryCNS,0,0,1,1,Clinical Neurology | Surgery,NA,NA,OXFORD UNIV PRESS INC,2009-11-03 +neurosurgery clinics of north america,1042-3680,1558-1349,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +neurosurgical focus,1092-0684,1092-0684,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,AMER ASSOC NEUROLOGICAL SURGEONS,NA +neurosurgical review,0344-5607,1437-2320,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,SPRINGER,NA +neurotherapeutics,1933-7213,1878-7479,NA,0,0,1,0,Clinical Neurology | Neurosciences | Pharmacology & Pharmacy,NA,NA,SPRINGER,NA +neurotoxicity research,1029-8428,1476-3524,NA,0,0,1,0,Neurosciences,NA,NA,SPRINGER,NA +neurotoxicology,0161-813X,1872-9711,NA,0,0,1,0,Neurosciences | Pharmacology & Pharmacy | Toxicology,NA,NA,ELSEVIER,NA +neurotoxicology and teratology,0892-0362,1872-9738,NA,0,0,1,0,Neurosciences | Toxicology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +neurourology and urodynamics,0733-2467,1520-6777,NA,0,0,1,0,Urology & Nephrology,NA,NA,WILEY,NA +new astronomy,1384-1076,1384-1092,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,ELSEVIER,NA +new astronomy reviews,1387-6473,1872-9630,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,ELSEVIER SCI LTD,NA +new biotechnology,1871-6784,1876-4347,NA,0,0,1,0,Biochemical Research Methods | Biotechnology & Applied Microbiology,NA,NA,ELSEVIER,NA +new carbon materials,1007-8827,1872-5805,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +new directions for child and adolescent development,1534-8687,1534-8687,NA,0,1,0,0,NA,"Psychology, Development",NA,WILEY PERIODICALS,NA +new england journal of medicine,0028-4793,1533-4406,NEJM,0,0,1,1,"Medicine, General & Internal",NA,NA,MASSACHUSETTS MEDICAL SOC,2009-03-23 +new england quarterly-a historical review of new england life and letters,0028-4866,1937-2213,_NEQuarterly_,1,0,0,1,NA,NA,"History | Literature, American",MIT PRESS,2017-06-20 +new england review-middlebury series,1053-1297,2161-9131,NERweb,1,0,0,1,NA,NA,Literary Reviews,MIDDLEBURY COLL PUBLICATIONS,2011-11-29 +new forests,0169-4286,1573-5095,NA,0,0,1,0,Forestry,NA,NA,SPRINGER,NA +new generation computing,0288-3635,1882-7055,NGC_1983,0,0,1,1,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods",NA,NA,SPRINGER,2020-02-01 +new genetics and society,1463-6778,1469-9915,NA,0,1,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,"History & Philosophy Of Science | Social Issues | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +new genetics and society,1463-6778,1469-9915,NA,0,1,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,"History & Philosophy Of Science | Social Issues | Social Sciences, Biomedical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +new german critique,0094-033X,1558-1462,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,DUKE UNIV PRESS,NA +new ideas in psychology,0732-118X,1873-3522,NA,0,1,0,0,NA,"Psychology, Multidisciplinary | Psychology, Experimental",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +new journal of chemistry,1144-0546,1369-9261,NewJChem,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,NA +new journal of physics,1367-2630,1367-2630,NJPhysics,0,0,1,1,"Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,2010-04-07 +new left review,0028-6060,2044-0480,newleftreview,0,1,0,1,NA,"Political Science | Social Sciences, Interdisciplinary",NA,NEW LEFT REV LTD,2012-10-29 +new literary history,0028-6087,1080-661X,NewLitHist,1,0,0,1,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,2017-12-21 +new media & society,1461-4448,1461-7315,NA,0,1,0,0,NA,Communication,NA,SAGE PUBLICATIONS LTD,NA +new medit,1594-5685,2611-1128,NA,0,0,1,0,"Agricultural Economics & Policy | Agriculture, Multidisciplinary",NA,NA,BONONIA UNIV PRESS,NA +new mexico historical review,0028-6206,0028-6206,HistoricalNew,1,0,0,1,NA,NA,History,UNIV NEW MEXICO,NA +new microbiologica,1121-7138,1121-7138,NA,0,0,1,0,Microbiology,NA,NA,EDIZIONI INT SRL,NA +new orleans review,0028-6400,NA,NOReview,1,0,0,1,NA,NA,Literary Reviews,LOYOLA UNIV,2012-08-23 +new perspectives on turkey,0896-6346,1305-3299,newpers_turkey,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,CAMBRIDGE UNIV PRESS,2019-11-12 +new phytologist,0028-646X,1469-8137,NewPhyt,0,0,1,1,Plant Sciences,NA,NA,WILEY,2009-09-13 +new political economy,1356-3467,1469-9923,npejournal,0,1,0,1,NA,Economics | International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-11-26 +new republic,0028-6583,NA,newrepublic,0,1,0,1,NA,Political Science,NA,NEW REPUBLIC INC,2009-10-15 +new review of film and television studies,1740-0309,1740-7923,NRFTSJournal,1,0,0,1,NA,NA,"Film, Radio, Television","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-09-22 +new review of hypermedia and multimedia,1361-4568,1740-7842,NA,0,0,1,0,"Computer Science, Information Systems",NA,NA,TAYLOR & FRANCIS LTD,NA +new scientist,0262-4079,2059-5387,newscientist,0,0,1,1,Multidisciplinary Sciences,NA,NA,NEW SCIENTIST LTD,2009-01-28 +new technology work and employment,0268-1072,1468-005X,NTWEjournal,0,1,0,1,NA,Ergonomics | Management,NA,WILEY,2020-05-12 +new testament studies,0028-6885,1469-8145,NA,1,0,0,0,NA,NA,Religion,CAMBRIDGE UNIV PRESS,NA +new theatre quarterly,0266-464X,1474-0613,NA,1,0,0,0,NA,NA,Theater,CAMBRIDGE UNIV PRESS,NA +new york history,0146-437X,2328-8132,NYHJournal,1,0,0,1,NA,NA,History,NEW YORK STATE HIST ASSOC,2019-08-01 +new york journal of mathematics,1076-9803,NA,NA,0,0,1,0,Mathematics,NA,NA,ELECTRONIC JOURNALS PROJECT,NA +new york review of books,0028-7504,1944-7744,nybooks,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",NEW YORK REVIEW,2007-12-14 +new york times book review,0028-7806,0028-7806,nytimesbooks,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",NEW YORK TIMES,2007-03-18 +new york university law review,0028-7881,0028-7881,nyulawreview,0,1,0,1,NA,Law,NA,NEW YORK UNIV SCHOOL LAW,2010-01-27 +new zealand entomologist,0077-9962,1179-3430,NZEntomologist,0,0,1,1,Entomology,NA,NA,TAYLOR & FRANCIS LTD,2021-07-05 +new zealand geographer,0028-8144,1745-7939,NA,0,1,0,0,NA,Geography,NA,WILEY,NA +new zealand journal of agricultural research,0028-8233,1175-8775,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +new zealand journal of botany,0028-825X,1175-8643,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +new zealand journal of crop and horticultural science,0114-0671,1175-8783,NA,0,0,1,0,Agronomy | Horticulture,NA,NA,TAYLOR & FRANCIS LTD,NA +new zealand journal of ecology,0110-6465,1177-7788,NA,0,0,1,0,Ecology,NA,NA,NEW ZEALAND ECOL SOC,NA +new zealand journal of forestry science,0048-0134,1179-5395,NA,0,0,1,0,Forestry,NA,NA,SCION,NA +new zealand journal of geology and geophysics,0028-8306,1175-8791,NA,0,0,1,0,"Geology | Geosciences, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +new zealand journal of history,0028-8322,0028-8322,NZJH1967,1,0,0,1,NA,NA,History,UNIV AUCKLAND,2019-12-05 +new zealand journal of marine and freshwater research,0028-8330,1175-8805,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology | Oceanography,NA,NA,TAYLOR & FRANCIS LTD,NA +new zealand journal of zoology,0301-4223,1175-8821,NA,0,0,1,0,Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +new zealand veterinary journal,0048-0169,1176-0710,NA,0,0,1,0,Veterinary Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +newsletters on stratigraphy,0078-0421,NA,NA,0,0,1,0,Geology,NA,NA,GEBRUDER BORNTRAEGER,NA +nexus network journal,1590-5896,1522-4600,nexusnetwj,1,0,1,1,History & Philosophy Of Science,NA,Architecture,KIM WILLIAMS BOOKS,2019-07-09 +nexus network journal,1590-5896,1522-4600,nexusnetwj,1,0,1,1,History & Philosophy Of Science,NA,Architecture,KIM WILLIAMS BOOKS,2019-07-09 +nicotine & tobacco research,1462-2203,1469-994X,NTR_Journal,0,1,1,1,"Substance Abuse | Public, Environmental & Occupational Health","Substance Abuse | Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,2019-09-07 +nicotine & tobacco research,1462-2203,1469-994X,NTR_Journal,0,1,1,1,"Substance Abuse | Public, Environmental & Occupational Health","Substance Abuse | Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,2019-09-07 +nigerian journal of clinical practice,1119-3077,1119-3077,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +nihon reoroji gakkaishi,0387-1533,0387-1533,NA,0,0,1,0,Mechanics | Polymer Science,NA,NA,"SOC RHEOLOGY, JAPAN",NA +nineteenth-century contexts-an interdisciplinary journal,0890-5495,1477-2663,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +nineteenth-century french studies,0146-7891,1536-0172,NCFS_journal,1,0,0,1,NA,NA,"Literature, Romance",UNIV NEBRASKA PRESS,2014-06-26 +nineteenth-century literature,0891-9356,0891-9356,NA,1,0,0,0,NA,NA,Literature,UNIV CALIFORNIA PRESS,NA +nineteenth-century music review,1479-4098,2044-8414,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +nineteenth century music,0148-2076,1533-8606,NA,1,0,0,0,NA,NA,Music,UNIV CALIFORNIA PRESS,NA +nineteenth century prose,1052-0406,NA,NA,1,0,0,0,NA,NA,Literature,NINETEENTH-CENTURY PROSE,NA +nippon suisan gakkaishi,0021-5392,1349-998X,NA,0,0,1,0,Fisheries,NA,NA,JAPANESE SOC FISHERIES SCIENCE,NA +nitric oxide-biology and chemistry,1089-8603,1089-8611,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +njas-impact in agricultural and life sciences,NA,2768-5241,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +nmr in biomedicine,0952-3480,1099-1492,NA,0,0,1,0,"Biophysics | Radiology, Nuclear Medicine & Medical Imaging | Spectroscopy",NA,NA,WILEY,NA +nmr in biomedicine,0952-3480,1099-1492,NA,0,0,1,0,"Biophysics | Radiology, Nuclear Medicine & Medical Imaging | Spectroscopy",NA,NA,WILEY,NA +nodea-nonlinear differential equations and applications,1021-9722,1420-9004,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER INT PUBL AG,NA +noise & health,1463-1741,1998-4030,NA,0,0,1,0,"Audiology & Speech-Language Pathology | Public, Environmental & Occupational Health",NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +noise control engineering journal,0736-2501,0736-2501,NA,0,0,1,0,"Acoustics | Engineering, Multidisciplinary",NA,NA,INST NOISE CONTROL ENGINEERING,NA +nondestructive testing and evaluation,1058-9759,1477-2671,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,TAYLOR & FRANCIS LTD,NA +nonlinear analysis-hybrid systems,1751-570X,1878-7460,NA,0,0,1,0,"Automation & Control Systems | Mathematics, Applied",NA,NA,ELSEVIER SCI LTD,NA +nonlinear analysis-modelling and control,1392-5113,2335-8963,"NAMC_VU",0,0,1,1,"Mathematics, Applied | Mathematics, Interdisciplinary Applications | Mechanics",NA,NA,"VILNIUS UNIV, INST MATHEMATICS & INFORMATICS",2022-02-28 +nonlinear analysis-real world applications,1468-1218,1878-5719,NA,0,0,1,0,"Mathematics, Applied",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +nonlinear analysis-theory methods & applications,0362-546X,1873-5215,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +nonlinear dynamics,0924-090X,1573-269X,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,SPRINGER,NA +nonlinear dynamics psychology and life sciences,1090-0578,1573-6652,NDPLS_SCTPLS,0,1,0,1,NA,"Social Sciences, Mathematical Methods | Psychology, Mathematical",NA,SOC CHAOS THEORY PSYCHOLOGY & LIFE SCIENCES,2022-01-20 +nonlinear processes in geophysics,1023-5809,1607-7946,EGU_NPG,0,0,1,1,"Geosciences, Multidisciplinary | Mathematics, Interdisciplinary Applications | Meteorology & Atmospheric Sciences | Physics, Fluids & Plasmas",NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-15 +nonlinearity,0951-7715,1361-6544,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,IOP PUBLISHING LTD,NA +nonprofit and voluntary sector quarterly,0899-7640,1552-7395,NVSQuarterly,0,1,0,1,NA,Social Issues,NA,SAGE PUBLICATIONS INC,2016-10-18 +nonprofit management & leadership,1048-6682,1542-7854,NA,0,1,0,0,NA,Management | Public Administration,NA,"WILEY PERIODICALS, INC",NA +nordic journal of botany,0107-055X,1756-1051,NordicJBotany,0,0,1,1,Plant Sciences,NA,NA,WILEY,2012-11-20 +nordic journal of linguistics,0332-5865,1502-4717,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +nordic journal of linguistics,0332-5865,1502-4717,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +nordic journal of music therapy,0809-8131,1944-8260,JournalNordicMT,0,1,0,1,NA,Rehabilitation,NA,GRIEG ACADEMY,2020-09-01 +nordic journal of psychiatry,0803-9488,1502-4725,NA,0,1,1,0,Psychiatry,Psychiatry,NA,TAYLOR & FRANCIS LTD,NA +nordic journal of psychiatry,0803-9488,1502-4725,NA,0,1,1,0,Psychiatry,Psychiatry,NA,TAYLOR & FRANCIS LTD,NA +nordic journal of religion and society,0809-7291,1890-7008,NA,1,0,0,0,NA,NA,Religion,SCANDINAVIAN UNIV PRESS-UNIVERSITETSFORLAGET AS,NA +nordic psychology,1901-2276,1904-0016,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +nordic pulp & paper research journal,0283-2631,2000-0669,NordicPulp,0,0,1,1,"Materials Science, Paper & Wood",NA,NA,WALTER DE GRUYTER GMBH,2021-10-19 +nordic studies on alcohol and drugs,1455-0725,1458-6126,"NAD_journal",0,1,0,1,NA,Substance Abuse,NA,SAGE PUBLICATIONS LTD,2017-09-12 +nordic theatre studies,0904-6380,2002-3898,NA,1,0,0,0,NA,NA,Theater,FORENINGEN NORDISKA TEATERFORSKARE,NA +noropsikiyatri arsivi-archives of neuropsychiatry,1300-0667,1309-4866,NA,0,0,1,0,Clinical Neurology,NA,NA,TURKISH NEUROPSYCHIATRY ASSOC-TURK NOROPSIKIYATRI DERNEGI,NA +norsk geografisk tidsskrift-norwegian journal of geography,0029-1951,1502-5292,NA,0,1,0,0,NA,Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +north-western journal of zoology,1584-9074,1842-6441,NA,0,0,1,0,Zoology,NA,NA,UNIV ORADEA PUBL HOUSE,NA +north american archaeologist,0197-6931,1541-3543,NA,1,0,0,0,NA,NA,Archaeology,SAGE PUBLICATIONS INC,NA +north american journal of aquaculture,1522-2055,1548-8454,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +north american journal of economics and finance,1062-9408,1879-0860,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,ELSEVIER SCIENCE INC,NA +north american journal of fisheries management,0275-5947,1548-8675,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +north american review,0029-2397,NA,NorthAmerReview,1,0,0,1,NA,NA,Literary Reviews,UNIV NORTHERN IOWA,2011-09-01 +northeastern naturalist,1092-6194,1938-5307,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,EAGLE HILL INST,NA +northern history,0078-172X,1745-8706,northernhist,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-10-03 +northern history,0078-172X,1745-8706,northernhist,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-10-03 +northwest science,0029-344X,2161-9859,NA,0,0,1,0,Ecology,NA,NA,NORTHWEST SCIENTIFIC ASSOC,NA +northwestern journal of international law & business,0196-3228,NA,NA,0,1,0,0,NA,Law,NA,NORTHWESTERN UNIV SCHOOL LAW,NA +northwestern university law review,0029-3571,NA,nwulrev,0,1,0,1,NA,Law,NA,NORTHWESTERN UNIV,2013-04-09 +norwegian archaeological review,0029-3652,1502-7678,NorwegianReview,1,0,0,1,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-10-22 +norwegian journal of geology,2387-5844,2387-5852,JournalNjg,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,GEOLOGICAL SOC NORWAY,2021-03-15 +nota lepidopterologica,0342-7536,2367-5365,NotaLepido,0,0,1,1,Entomology,NA,NA,PENSOFT PUBLISHERS,2014-04-09 +notarzt,0177-2309,1438-8693,NA,0,0,1,0,Emergency Medicine,NA,NA,GEORG THIEME VERLAG KG,NA +notes,0027-4380,1534-150X,notes_journal,1,0,0,1,NA,NA,Music,MUSIC LIBRARY ASSOC,2016-09-24 +notes and queries,0029-3970,1471-6941,NA,1,0,0,0,NA,NA,Literature,OXFORD UNIV PRESS,NA +notes and records-the royal society journal of the history of science,0035-9149,1743-0178,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,ROYAL SOC,NA +notes and records-the royal society journal of the history of science,0035-9149,1743-0178,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,ROYAL SOC,NA +notfall & rettungsmedizin,1434-6222,1436-0578,NA,0,0,1,0,Emergency Medicine,NA,NA,SPRINGER,NA +notornis,0029-4470,1177-7680,NA,0,0,1,0,Ornithology,NA,NA,ORNITHOLOGICAL SOC NEW ZEALAND,NA +notre dame journal of formal logic,0029-4527,1939-0726,NA,1,0,1,0,Mathematics | Logic,NA,Philosophy,DUKE UNIV PRESS,NA +notre dame journal of formal logic,0029-4527,1939-0726,NA,1,0,1,0,Mathematics | Logic,NA,Philosophy,DUKE UNIV PRESS,NA +notre dame law review,0745-3515,NA,notredamelrev,0,1,0,1,NA,Law,NA,NOTRE DAME LAW SCHOOL,2014-03-20 +nottingham french studies,0029-4586,2047-7236,nfs_journal,1,0,0,1,NA,NA,"Literature, Romance",EDINBURGH UNIV PRESS,2015-12-02 +notulae botanicae horti agrobotanici cluj-napoca,0255-965X,1842-4309,NA,0,0,1,0,Plant Sciences,NA,NA,UNIV AGR SCI & VETERINARY MED CLUJ-NAPOCA,NA +nous,0029-4624,1468-0068,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +nouvelle revue francaise,0029-4802,NA,NA,1,0,0,0,NA,NA,"Literature, Romance",EDITIONS GALLIMARD,NA +nova hedwigia,0029-5035,2363-7188,NA,0,0,1,0,Plant Sciences,NA,NA,GEBRUDER BORNTRAEGER,NA +nova religio-journal of alternative and emergent religions,1092-6690,1541-8480,Nova_Religio,1,0,0,1,NA,NA,Religion,UNIV CALIFORNIA PRESS,2021-12-13 +novel-a forum on fiction,0029-5132,1945-8509,NA,1,0,0,0,NA,NA,Literature,DUKE UNIV PRESS,NA +novoe literaturnoe obozrenie,0869-6365,NA,NA,1,0,0,0,NA,NA,"Literary Theory & Criticism | Literature, Slavic",NOVOE LITERATURNOE OBOZRENIE-NEW LITERARY OBSERVER,NA +novon,1055-3177,1945-6174,NA,0,0,1,0,Plant Sciences,NA,NA,MISSOURI BOTANICAL GARDEN,NA +novum testamentum,0048-1009,0048-1009,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +novyi mir,0130-7673,NA,NA,1,0,0,0,NA,NA,Literary Reviews,IZD STVO IZVESTIYA,NA +npg asia materials,1884-4049,1884-4057,AsiaMaterials,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",2013-05-21 +npj 2d materials and applications,2397-7132,2397-7132,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,"NATURE PORTFOLIO",NA +npj biofilms and microbiomes,2055-5008,2055-5008,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,"NATURE PORTFOLIO",NA +npj breast cancer,2374-4677,2374-4677,NA,0,0,1,0,Oncology,NA,NA,"NATURE PORTFOLIO",NA +npj clean water,2059-7037,2059-7037,NA,0,0,1,0,"Engineering, Chemical | Environmental Sciences | Water Resources",NA,NA,"NATURE PORTFOLIO",NA +npj climate and atmospheric science,2397-3722,2397-3722,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,"NATURE PORTFOLIO",NA +npj computational materials,2057-3960,2057-3960,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",NA +npj digital medicine,2398-6352,2398-6352,npjDigitalMed,0,0,1,1,Health Care Sciences & Services | Medical Informatics,NA,NA,"NATURE PORTFOLIO",2022-02-28 +npj flexible electronics,2397-4621,2397-4621,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",NA +npj genomic medicine,2056-7944,2056-7944,NA,0,0,1,0,Genetics & Heredity,NA,NA,"NATURE PORTFOLIO",NA +npj materials degradation,2397-2106,2397-2106,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,"NATURE PORTFOLIO",NA +npj microgravity,2373-8065,2373-8065,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,"NATURE PORTFOLIO",NA +npj parkinsons disease,2373-8057,2373-8057,NA,0,0,1,0,Neurosciences,NA,NA,"NATURE PORTFOLIO",NA +npj precision oncology,2397-768X,2397-768X,NA,0,0,1,0,Oncology,NA,NA,"NATURE PORTFOLIO",NA +npj primary care respiratory medicine,2055-1010,2055-1010,NA,0,0,1,0,Primary Health Care | Respiratory System,NA,NA,"NATURE PORTFOLIO",NA +npj quantum information,2056-6387,2056-6387,NA,0,0,1,0,"Quantum Science & Technology | Physics, Applied | Physics, Atomic, Molecular & Chemical | Physics, Condensed Matter",NA,NA,"NATURE PORTFOLIO",NA +npj quantum materials,2397-4648,2397-4648,NA,0,0,1,0,"Materials Science, Multidisciplinary | Quantum Science & Technology | Physics, Applied | Physics, Condensed Matter",NA,NA,"NATURE PORTFOLIO",NA +npj regenerative medicine,2057-3995,2057-3995,NA,0,0,1,0,"Cell & Tissue Engineering | Engineering, Biomedical",NA,NA,"NATURE PORTFOLIO",NA +npj schizophrenia,2334-265X,2334-265X,NA,0,0,1,0,Psychiatry,NA,NA,"NATURE PORTFOLIO",NA +npj science of food,2396-8370,2396-8370,NA,0,0,1,0,Food Science & Technology,NA,NA,"NATURE PORTFOLIO",NA +npj science of learning,2056-7936,2056-7936,NA,0,1,1,0,Neurosciences,"Education & Educational Research | Psychology, Experimental",NA,"NATURE PORTFOLIO",NA +npj science of learning,2056-7936,2056-7936,NA,0,1,1,0,Neurosciences,"Education & Educational Research | Psychology, Experimental",NA,"NATURE PORTFOLIO",NA +npj systems biology and applications,2056-7189,2056-7189,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,"NATURE PORTFOLIO",NA +npj vaccines,2059-0105,2059-0105,NA,0,0,1,0,"Immunology | Medicine, Research & Experimental",NA,NA,"NATURE PORTFOLIO",NA +ntm,0036-6978,1420-9144,NA,1,0,0,0,NA,NA,History & Philosophy Of Science,SPRINGER INT PUBL AG,NA +nuclear data sheets,0090-3752,1095-9904,NA,0,0,1,0,"Physics, Nuclear",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +nuclear engineering and design,0029-5493,1872-759X,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,ELSEVIER SCIENCE SA,NA +nuclear engineering and technology,1738-5733,1738-5733,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,KOREAN NUCLEAR SOC,NA +nuclear engineering international,0029-5507,0029-5507,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,WILMINGTON PUBL,NA +nuclear fusion,0029-5515,1741-4326,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,IOP PUBLISHING LTD,NA +nuclear instruments & methods in physics research section a-accelerators spectrometers detectors and associated equipment,0168-9002,1872-9576,NA,0,0,1,0,"Instruments & Instrumentation | Nuclear Science & Technology | Physics, Nuclear | Physics, Particles & Fields",NA,NA,ELSEVIER,NA +nuclear instruments & methods in physics research section b-beam interactions with materials and atoms,0168-583X,1872-9584,NA,0,0,1,0,"Instruments & Instrumentation | Nuclear Science & Technology | Physics, Atomic, Molecular & Chemical | Physics, Nuclear",NA,NA,ELSEVIER,NA +nuclear materials and energy,2352-1791,2352-1791,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,ELSEVIER,NA +nuclear medicine and biology,0969-8051,1872-9614,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,NA +nuclear medicine communications,0143-3636,1473-5628,NMC_Journal,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2012-08-03 +nuclear physics a,0375-9474,1873-1554,NA,0,0,1,0,"Physics, Nuclear",NA,NA,ELSEVIER,NA +nuclear physics b,0550-3213,1873-1562,NA,0,0,1,0,"Physics, Particles & Fields",NA,NA,ELSEVIER,NA +nuclear science and engineering,0029-5639,1943-748X,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,TAYLOR & FRANCIS INC,NA +nuclear science and techniques,1001-8042,2210-3147,NA,0,0,1,0,"Nuclear Science & Technology | Physics, Nuclear",NA,NA,SPRINGER SINGAPORE PTE LTD,NA +nuclear technology,0029-5450,1943-7471,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,TAYLOR & FRANCIS INC,NA +nuclear technology & radiation protection,1451-3994,1452-8185,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,VINCA INST NUCLEAR SCI,NA +nucleic acid therapeutics,2159-3337,2159-3345,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Medicinal | Medicine, Research & Experimental",NA,NA,"MARY ANN LIEBERT, INC",NA +nucleic acids research,0305-1048,1362-4962,"NAR_Open",0,0,1,1,Biochemistry & Molecular Biology,NA,NA,OXFORD UNIV PRESS,2015-03-04 +nucleosides nucleotides & nucleic acids,1525-7770,1532-2335,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,TAYLOR & FRANCIS INC,NA +nucleus,1949-1034,1949-1042,NA,0,0,1,0,Cell Biology,NA,NA,TAYLOR & FRANCIS INC,NA +nuklearmedizin-nuclear medicine,0029-5566,2567-6407,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,GEORG THIEME VERLAG KG,NA +nukleonika,0029-5922,1508-5791,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Physics, Nuclear",NA,NA,SCIENDO,NA +numen-international review for the history of religions,0029-5973,1568-5276,NA,1,0,0,0,NA,NA,History | Religion,BRILL,NA +numerical algorithms,1017-1398,1572-9265,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER,NA +numerical functional analysis and optimization,0163-0563,1532-2467,NA,0,0,1,0,"Mathematics, Applied",NA,NA,TAYLOR & FRANCIS INC,NA +numerical heat transfer part a-applications,1040-7782,1521-0634,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,TAYLOR & FRANCIS INC,NA +numerical heat transfer part b-fundamentals,1040-7790,1521-0626,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,TAYLOR & FRANCIS INC,NA +numerical linear algebra with applications,1070-5325,1099-1506,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,WILEY,NA +numerical mathematics-theory methods and applications,1004-8979,2079-7338,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,GLOBAL SCIENCE PRESS,NA +numerical methods for partial differential equations,0749-159X,1098-2426,NA,0,0,1,0,"Mathematics, Applied",NA,NA,WILEY,NA +numerische mathematik,0029-599X,0945-3245,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +nuncius-journal of the history of science,0394-7394,1825-3911,NunciusJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,BRILL,2021-01-15 +nuncius-journal of the history of science,0394-7394,1825-3911,NunciusJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,BRILL,2021-01-15 +nuncius-journal of the history of science,0394-7394,1825-3911,NunciusJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,BRILL,2021-01-15 +nuova rivista storica,0029-6236,NA,NA,1,0,0,0,NA,NA,History,SOC EDITRICE DANTE ALIGHIERI SRL,NA +nurse education in practice,1471-5953,1873-5223,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCI LTD,NA +nurse education in practice,1471-5953,1873-5223,NA,0,1,1,0,Nursing,Nursing,NA,ELSEVIER SCI LTD,NA +nurse education today,0260-6917,1532-2793,NurseEducToday,0,1,1,1,"Education, Scientific Disciplines | Nursing",Nursing,NA,CHURCHILL LIVINGSTONE,2013-07-23 +nurse education today,0260-6917,1532-2793,NurseEducToday,0,1,1,1,"Education, Scientific Disciplines | Nursing",Nursing,NA,CHURCHILL LIVINGSTONE,2013-07-23 +nurse educator,0363-3624,1538-9855,NEjournalonline,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-11-17 +nurse educator,0363-3624,1538-9855,NEjournalonline,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-11-17 +nursing & health sciences,1441-0745,1442-2018,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +nursing & health sciences,1441-0745,1442-2018,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +nursing clinics of north america,0029-6465,1558-1357,NA,0,1,1,0,Nursing,Nursing,NA,W B SAUNDERS CO-ELSEVIER INC,NA +nursing clinics of north america,0029-6465,1558-1357,NA,0,1,1,0,Nursing,Nursing,NA,W B SAUNDERS CO-ELSEVIER INC,NA +nursing economics,0746-1739,NA,NursingEcon,0,1,1,1,Nursing,Nursing,NA,"JANNETTI PUBLICATIONS, INC",2010-01-27 +nursing economics,0746-1739,NA,NursingEcon,0,1,1,1,Nursing,Nursing,NA,"JANNETTI PUBLICATIONS, INC",2010-01-27 +nursing ethics,0969-7330,1477-0989,NA,0,1,1,0,Nursing,Nursing | Ethics,NA,SAGE PUBLICATIONS LTD,NA +nursing ethics,0969-7330,1477-0989,NA,0,1,1,0,Nursing,Nursing | Ethics,NA,SAGE PUBLICATIONS LTD,NA +nursing in critical care,1362-1017,1478-5153,niccjournal,0,1,1,1,Nursing,Nursing,NA,WILEY,2019-12-05 +nursing in critical care,1362-1017,1478-5153,niccjournal,0,1,1,1,Nursing,Nursing,NA,WILEY,2019-12-05 +nursing inquiry,1320-7881,1440-1800,NursingInquiry,0,1,1,1,Nursing,Nursing,NA,WILEY,2013-03-18 +nursing inquiry,1320-7881,1440-1800,NursingInquiry,0,1,1,1,Nursing,Nursing,NA,WILEY,2013-03-18 +nursing open,2054-1058,2054-1058,NursingOpen,0,1,1,1,Nursing,Nursing,NA,WILEY,2014-02-25 +nursing open,2054-1058,2054-1058,NursingOpen,0,1,1,1,Nursing,Nursing,NA,WILEY,2014-02-25 +nursing outlook,0029-6554,1528-3968,NursingOutlook,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,2016-10-28 +nursing outlook,0029-6554,1528-3968,NursingOutlook,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,2016-10-28 +nursing philosophy,1466-7681,1466-769X,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +nursing philosophy,1466-7681,1466-769X,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +nursing research,0029-6562,1538-9847,NResonline,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-21 +nursing research,0029-6562,1538-9847,NResonline,0,1,1,1,Nursing,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-21 +nursing science quarterly,0894-3184,1552-7409,NA,0,1,1,0,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +nursing science quarterly,0894-3184,1552-7409,NA,0,1,1,0,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,NA +nutricion hospitalaria,0212-1611,1699-5198,NutrionH,0,0,1,1,Nutrition & Dietetics,NA,NA,"ARAN EDICIONES, S L",2018-12-04 +nutrient cycling in agroecosystems,1385-1314,1573-0867,NA,0,0,1,0,Soil Science,NA,NA,SPRINGER,NA +nutrients,2072-6643,2072-6643,Nutrients_MDPI,0,0,1,1,Nutrition & Dietetics,NA,NA,MDPI,2015-09-16 +nutrition,0899-9007,1873-1244,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,ELSEVIER SCIENCE INC,NA +nutrition & diabetes,2044-4052,2044-4052,NutDiab_Journal,0,0,1,1,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,SPRINGERNATURE,2021-04-15 +nutrition & dietetics,1446-6368,1747-0080,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,WILEY,NA +nutrition & metabolism,1743-7075,1743-7075,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,BMC,NA +nutrition and cancer-an international journal,0163-5581,1532-7914,NA,0,0,1,0,Oncology | Nutrition & Dietetics,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +nutrition bulletin,1471-9827,1467-3010,NBU_Editor,0,0,1,1,Nutrition & Dietetics,NA,NA,WILEY,2015-06-22 +nutrition clinique et metabolisme,0985-0562,1768-3092,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,MASSON EDITEUR,NA +nutrition in clinical practice,0884-5336,1941-2452,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,WILEY,NA +nutrition journal,1475-2891,1475-2891,NutrJournal,0,0,1,1,Nutrition & Dietetics,NA,NA,BMC,2019-02-05 +nutrition metabolism and cardiovascular diseases,0939-4753,1590-3729,NA,0,0,1,0,Cardiac & Cardiovascular System | Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,ELSEVIER SCI LTD,NA +nutrition research,0271-5317,1879-0739,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +nutrition research and practice,1976-1457,2005-6168,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,KOREAN NUTRITION SOC,NA +nutrition research reviews,0954-4224,1475-2700,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,CAMBRIDGE UNIV PRESS,NA +nutrition reviews,0029-6643,1753-4887,NutrReviews,0,0,1,1,Nutrition & Dietetics,NA,NA,OXFORD UNIV PRESS INC,2020-05-05 +nutritional neuroscience,1028-415X,1476-8305,NA,0,0,1,0,Neurosciences | Nutrition & Dietetics,NA,NA,TAYLOR & FRANCIS LTD,NA +nwig-new west indian guide-nieuwe west-indische gids,1382-2373,1382-2373,NA,1,1,0,0,NA,Area Studies,"Humanities, Multidisciplinary",KITLV PRESS,NA +nwig-new west indian guide-nieuwe west-indische gids,1382-2373,1382-2373,NA,1,1,0,0,NA,Area Studies,"Humanities, Multidisciplinary",KITLV PRESS,NA +obesity,1930-7381,1930-739X,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,WILEY,NA +obesity facts,1662-4025,1662-4033,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,KARGER,NA +obesity research & clinical practice,1871-403X,1878-0318,NA,0,0,1,0,Endocrinology & Metabolism | Nutrition & Dietetics,NA,NA,ELSEVIER SCI LTD,NA +obesity reviews,1467-7881,1467-789X,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,WILEY,NA +obesity surgery,0960-8923,1708-0428,JournalObesity,0,0,1,1,Surgery,NA,NA,SPRINGER,2020-03-13 +observatory,0029-7704,NA,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,OBSERVATORY,NA +obstetrical & gynecological survey,0029-7828,1533-9866,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +obstetrics and gynecology,0029-7844,0029-7844,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +obstetrics and gynecology clinics of north america,0889-8545,1558-0474,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +occupational and environmental medicine,1351-0711,1470-7926,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,BMJ PUBLISHING GROUP,NA +occupational medicine-oxford,0962-7480,1471-8405,journal_occmed,0,0,1,1,"Public, Environmental & Occupational Health",NA,NA,OXFORD UNIV PRESS,2013-05-16 +occupational therapy international,0966-7903,1557-0703,NA,0,1,1,0,Rehabilitation,Rehabilitation,NA,WILEY-HINDAWI,NA +occupational therapy international,0966-7903,1557-0703,NA,0,1,1,0,Rehabilitation,Rehabilitation,NA,WILEY-HINDAWI,NA +ocean & coastal management,0964-5691,1873-524X,NA,0,0,1,0,Oceanography | Water Resources,NA,NA,ELSEVIER SCI LTD,NA +ocean and coastal research,NA,2675-2824,ocean_coast_res,0,0,1,1,Oceanography | Marine & Freshwater Biology,NA,NA,"INST OCEANOGRAFICO, UNIV SAO PAULO",2020-12-09 +ocean development and international law,0090-8320,1521-0642,NA,0,1,0,0,NA,International Relations | Law,NA,TAYLOR & FRANCIS INC,NA +ocean dynamics,1616-7341,1616-7228,NA,0,0,1,0,Oceanography,NA,NA,SPRINGER HEIDELBERG,NA +ocean engineering,0029-8018,1873-5258,NA,0,0,1,0,"Engineering, Marine | Engineering, Civil | Engineering, Ocean | Oceanography",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +ocean modelling,1463-5003,1463-5011,NA,0,0,1,0,Meteorology & Atmospheric Sciences | Oceanography,NA,NA,ELSEVIER SCI LTD,NA +ocean science,1812-0784,1812-0792,NA,0,0,1,0,Meteorology & Atmospheric Sciences | Oceanography,NA,NA,COPERNICUS GESELLSCHAFT MBH,NA +ocean science journal,1738-5261,2005-7172,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,KOREA INST OCEAN SCIENCE & TECHNOLOGY-KIOST,NA +oceania,0029-8077,1834-4461,OceaniaJournal,0,1,0,1,NA,Anthropology,NA,WILEY,2017-11-06 +oceanic linguistics,0029-8115,1527-9421,NA,1,0,0,0,NA,NA,Language & Linguistics,UNIV HAWAII PRESS,NA +oceanography,1042-8275,1042-8275,NA,0,0,1,0,Oceanography,NA,NA,OCEANOGRAPHY SOC,NA +oceanography and marine biology,0078-3218,NA,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,CRC PRESS-TAYLOR & FRANCIS GROUP,NA +oceanologia,0078-3234,2300-7370,NA,0,0,1,0,Oceanography,NA,NA,POLISH ACAD SCIENCES INST OCEANOLOGY,NA +oceanological and hydrobiological studies,1730-413X,1897-3191,NA,0,0,1,0,Oceanography,NA,NA,WALTER DE GRUYTER GMBH,NA +oceanology,0001-4370,1531-8508,NA,0,0,1,0,Oceanography,NA,NA,PLEIADES PUBLISHING INC,NA +ochrona srodowiska,1230-6169,1230-6169,NA,0,0,1,0,"Engineering, Environmental",NA,NA,POLISH SANITARY ENGINEERS ASSOC,NA +october,0162-2870,1536-013X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",MIT PRESS,NA +ocular immunology and inflammation,0927-3948,1744-5078,NA,0,0,1,0,Ophthalmology,NA,NA,TAYLOR & FRANCIS INC,NA +ocular surface,1542-0124,1937-5913,NA,0,0,1,0,Ophthalmology,NA,NA,ELSEVIER,NA +odonatologica,0375-0183,0375-0183,NA,0,0,1,0,Entomology,NA,NA,SOC INT ODONATOLOGICA,NA +odontology,1618-1247,1618-1255,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,SPRINGER,NA +oecologia,0029-8549,1432-1939,NA,0,0,1,0,Ecology,NA,NA,SPRINGER,NA +oeconomia copernicana,2083-1277,2353-1827,NA,0,1,0,0,NA,Economics,NA,INST BADAN GOSPODARCZYCH,NA +oeno one,2494-1271,2494-1271,oeno_one,0,0,1,1,Food Science & Technology,NA,NA,INT VITICULTURE & ENOLOGY SOC-IVES,2016-01-05 +ofioliti,0391-2612,NA,NA,0,0,1,0,Geology,NA,NA,OFIOLITI,NA +oikos,0030-1299,1600-0706,Oikos_Journal,0,0,1,1,Ecology,NA,NA,WILEY,2010-12-10 +oil & gas journal,0030-1388,1944-9151,OGJOnline,0,0,1,1,"Energy & Fuels | Engineering, Petroleum",NA,NA,PENNWELL PUBL CO ENERGY GROUP,2009-04-07 +oil & gas science and technology-revue d ifp energies nouvelles,1294-4475,1953-8189,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical | Engineering, Petroleum",NA,NA,EDP SCIENCES S A,NA +oil gas-european magazine,0342-5622,NA,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum",NA,NA,URBAN-VERLAG GMBH,NA +oil shale,0208-189X,1736-7492,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum",NA,NA,ESTONIAN ACAD PUBLISHERS,NA +olba,1301-7667,NA,NA,1,0,0,0,NA,NA,Archaeology,MERSIN UNIV PUBL RES CENTER CILICIAN ARCHAEOLOGY,NA +omega-international journal of management science,0305-0483,1873-5274,NA,0,1,1,0,Operations Research & Management Science,Management,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +omega-international journal of management science,0305-0483,1873-5274,NA,0,1,1,0,Operations Research & Management Science,Management,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +omega-journal of death and dying,0030-2228,1541-3764,NA,0,1,0,0,NA,"Psychology, Multidisciplinary | Social Sciences, Biomedical",NA,SAGE PUBLICATIONS INC,NA +omics-a journal of integrative biology,1536-2310,1557-8100,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity,NA,NA,"MARY ANN LIEBERT, INC",NA +oncogene,0950-9232,1476-5594,oncogenejournal,0,0,1,1,Biochemistry & Molecular Biology | Oncology | Cell Biology | Genetics & Heredity,NA,NA,SPRINGERNATURE,2018-07-26 +oncogenesis,2157-9024,2157-9024,NA,0,0,1,0,Oncology,NA,NA,SPRINGERNATURE,NA +oncoimmunology,2162-402X,2162-402X,NA,0,0,1,0,Oncology | Immunology,NA,NA,TAYLOR & FRANCIS INC,NA +oncologie,1292-3818,1765-2839,NA,0,0,1,0,Oncology,NA,NA,TECH SCIENCE PRESS,NA +oncologist,1083-7159,1549-490X,OncJournal,0,0,1,1,Oncology,NA,NA,WILEY,2010-07-28 +oncology,0030-2414,1423-0232,NA,0,0,1,0,Oncology,NA,NA,KARGER,NA +oncology-new york,0890-9091,0030-2414,NA,0,0,1,0,Oncology,NA,NA,UBM MEDICA,NA +oncology letters,1792-1074,1792-1082,LettersOncology,0,0,1,1,Oncology,NA,NA,SPANDIDOS PUBL LTD,2018-05-23 +oncology nursing forum,0190-535X,1538-0688,NA,0,1,1,0,Oncology | Nursing,Nursing,NA,ONCOLOGY NURSING SOC,NA +oncology nursing forum,0190-535X,1538-0688,NA,0,1,1,0,Oncology | Nursing,Nursing,NA,ONCOLOGY NURSING SOC,NA +oncology reports,1021-335X,1791-2431,OncologyReports,0,0,1,1,Oncology,NA,NA,SPANDIDOS PUBL LTD,2018-05-16 +oncology research,0965-0407,1555-3906,NA,0,0,1,0,Oncology,NA,NA,COGNIZANT COMMUNICATION CORP,NA +oncology research and treatment,2296-5270,2296-5262,NA,0,0,1,0,Oncology,NA,NA,KARGER,NA +oncotargets and therapy,1178-6930,1178-6930,NA,0,0,1,0,Biotechnology & Applied Microbiology | Oncology,NA,NA,DOVE MEDICAL PRESS LTD,NA +onderstepoort journal of veterinary research,0030-2465,2219-0635,NA,0,0,1,0,Veterinary Sciences,NA,NA,AOSIS,NA +one health,2352-7714,2352-7714,NA,0,0,1,0,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,ELSEVIER,NA +onkologe,0947-8965,1433-0415,NA,0,0,1,0,Oncology,NA,NA,SPRINGER HEIDELBERG,NA +online information review,1468-4527,1468-4535,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +online information review,1468-4527,1468-4535,NA,0,1,1,0,"Computer Science, Information Systems",Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +onomazein,0717-1285,0718-5758,Onomazein,1,1,0,1,NA,Linguistics,Language & Linguistics,"PONTIFICIA UNIV CATOLICA CHILE, FAC LETRAS",2013-09-10 +onomazein,0717-1285,0718-5758,Onomazein,1,1,0,1,NA,Linguistics,Language & Linguistics,"PONTIFICIA UNIV CATOLICA CHILE, FAC LETRAS",2013-09-10 +open archaeology,2300-6560,2300-6560,NA,1,0,0,0,NA,NA,Archaeology,DE GRUYTER POLAND SP Z O O,NA +open astronomy,2543-6376,2543-6376,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,DE GRUYTER POLAND SP Z O O,NA +open biology,2046-2441,2046-2441,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,ROYAL SOC,NA +open chemistry,2391-5420,2391-5420,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,DE GRUYTER POLAND SP Z O O,NA +open economies review,0923-7992,1573-708X,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +open forum infectious diseases,2328-8957,2328-8957,OFIDJournal,0,0,1,1,Immunology | Infectious Diseases | Microbiology,NA,NA,OXFORD UNIV PRESS INC,2022-02-25 +open geosciences,2391-5447,2391-5447,DGOpenGeo,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,DE GRUYTER POLAND SP Z O O,2014-05-19 +open house international,0168-2601,2633-9838,NA,1,1,0,0,NA,Environmental Studies | Urban Studies,Architecture,EMERALD GROUP PUBLISHING LTD,NA +open house international,0168-2601,2633-9838,NA,1,1,0,0,NA,Environmental Studies | Urban Studies,Architecture,EMERALD GROUP PUBLISHING LTD,NA +open life sciences,2391-5412,2391-5412,NA,0,0,1,0,Biology,NA,NA,DE GRUYTER POLAND SP Z O O,NA +open mathematics,2391-5455,2391-5455,NA,0,0,1,0,Mathematics,NA,NA,DE GRUYTER POLAND SP Z O O,NA +open medicine,2391-5463,2391-5463,OpenMedicine,0,0,1,1,"Medicine, General & Internal",NA,NA,DE GRUYTER POLAND SP Z O O,2008-12-09 +open physics,2391-5471,2391-5471,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,DE GRUYTER POLAND SP Z O O,NA +open systems & information dynamics,1230-1612,1793-7191,NA,0,0,1,0,"Physics, Mathematical | Statistics & Probability",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +opera,0030-3526,0030-3526,NA,1,0,0,0,NA,NA,Music,OPERA MAGAZINE,NA +opera news,0030-3607,1938-1506,OPERANEWS,1,0,0,1,NA,NA,Music,METROPOLITAN OPERA GUILD INC,2010-03-26 +opera quarterly,0736-0053,1476-2870,NA,1,0,0,0,NA,NA,Music,OXFORD UNIV PRESS,NA +operational research,1109-2858,1866-1505,NA,0,0,1,0,Operations Research & Management Science,NA,NA,SPRINGER HEIDELBERG,NA +operations management research,1936-9735,1936-9743,NA,0,1,0,0,NA,Management,NA,SPRINGER,NA +operations research,0030-364X,1526-5463,NA,0,1,1,0,Operations Research & Management Science,Management,NA,INFORMS,NA +operations research,0030-364X,1526-5463,NA,0,1,1,0,Operations Research & Management Science,Management,NA,INFORMS,NA +operations research letters,0167-6377,1872-7468,NA,0,0,1,0,Operations Research & Management Science,NA,NA,ELSEVIER,NA +operations research perspectives,2214-7160,2214-7160,NA,0,0,1,0,Operations Research & Management Science,NA,NA,ELSEVIER,NA +operative dentistry,0361-7734,1559-2863,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,OPERATIVE DENTISTRY INC,NA +operative neurosurgery,2332-4252,2332-4260,NA,0,0,1,0,Clinical Neurology | Surgery,NA,NA,OXFORD UNIV PRESS INC,NA +operative orthopadie und traumatologie,0934-6694,1439-0981,NA,0,0,1,0,Orthopedics,NA,NA,URBAN & VOGEL,NA +operative techniques in sports medicine,1060-1872,1557-9794,NA,0,0,1,0,Sport Sciences | Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +operators and matrices,1846-3886,1846-3886,NA,0,0,1,0,Mathematics,NA,NA,ELEMENT,NA +ophthalmic and physiological optics,0275-5408,1475-1313,NA,0,0,1,0,Ophthalmology,NA,NA,WILEY,NA +ophthalmic epidemiology,0928-6586,1744-5086,NA,0,0,1,0,Ophthalmology,NA,NA,TAYLOR & FRANCIS INC,NA +ophthalmic genetics,1381-6810,1744-5094,NA,0,0,1,0,Genetics & Heredity | Ophthalmology,NA,NA,TAYLOR & FRANCIS INC,NA +ophthalmic plastic and reconstructive surgery,0740-9303,1537-2677,NA,0,0,1,0,Ophthalmology | Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +ophthalmic research,0030-3747,1423-0259,NA,0,0,1,0,Ophthalmology,NA,NA,KARGER,NA +ophthalmic surgery lasers & imaging retina,2325-8160,2325-8179,OSLIJournal,0,0,1,1,Ophthalmology | Surgery,NA,NA,SLACK INC,2009-12-10 +ophthalmologe,0941-293X,1433-0423,NA,0,0,1,0,Ophthalmology,NA,NA,SPRINGER HEIDELBERG,NA +ophthalmologica,0030-3755,1423-0267,NA,0,0,1,0,Ophthalmology,NA,NA,KARGER,NA +ophthalmology,0161-6420,1549-4713,NA,0,0,1,0,Ophthalmology,NA,NA,ELSEVIER SCIENCE INC,NA +ophthalmology and therapy,2193-8245,2193-6528,NA,0,0,1,0,Ophthalmology,NA,NA,SPRINGER INT PUBL AG,NA +optica,2334-2536,2334-2536,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC AMER,NA +optica applicata,0078-5466,1899-7015,NA,0,0,1,0,Optics,NA,NA,WROCLAW UNIV SCIENCE TECHNOLOGY,NA +optical and quantum electronics,0306-8919,1572-817X,NA,0,0,1,0,"Engineering, Electrical & Electronic | Quantum Science & Technology | Optics",NA,NA,SPRINGER,NA +optical engineering,0091-3286,1560-2303,NA,0,0,1,0,Optics,NA,NA,SPIE-SOC PHOTO-OPTICAL INSTRUMENTATION ENGINEERS,NA +optical fiber technology,1068-5200,1095-9912,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Telecommunications",NA,NA,ELSEVIER SCIENCE INC,NA +optical materials,0925-3467,1873-1252,NA,0,0,1,0,"Materials Science, Multidisciplinary | Optics",NA,NA,ELSEVIER,NA +optical materials express,2159-3930,2159-3930,NA,0,0,1,0,"Materials Science, Multidisciplinary | Optics",NA,NA,OPTICAL SOC AMER,NA +optical review,1340-6000,1349-9432,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC JAPAN,NA +optical switching and networking,1573-4277,1872-9770,NA,0,0,1,0,"Computer Science, Information Systems | Optics | Telecommunications",NA,NA,ELSEVIER,NA +optics and laser technology,0030-3992,1879-2545,NA,0,0,1,0,"Optics | Physics, Applied",NA,NA,ELSEVIER SCI LTD,NA +optics and lasers in engineering,0143-8166,1873-0302,NA,0,0,1,0,Optics,NA,NA,ELSEVIER SCI LTD,NA +optics and spectroscopy,0030-400X,1562-6911,NA,0,0,1,0,Optics | Spectroscopy,NA,NA,PLEIADES PUBLISHING INC,NA +optics communications,0030-4018,1873-0310,NA,0,0,1,0,Optics,NA,NA,ELSEVIER,NA +optics express,1094-4087,1094-4087,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC AMER,NA +optics letters,0146-9592,1539-4794,NA,0,0,1,0,Optics,NA,NA,OPTICAL SOC AMER,NA +optik,0030-4026,1618-1336,NA,0,0,1,0,Optics,NA,NA,ELSEVIER GMBH,NA +optimal control applications & methods,0143-2087,1099-1514,NA,0,0,1,0,"Automation & Control Systems | Operations Research & Management Science | Mathematics, Applied",NA,NA,WILEY,NA +optimization,0233-1934,1029-4945,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,TAYLOR & FRANCIS LTD,NA +optimization and engineering,1389-4420,1573-2924,NA,0,0,1,0,"Engineering, Multidisciplinary | Operations Research & Management Science | Mathematics, Interdisciplinary Applications",NA,NA,SPRINGER,NA +optimization letters,1862-4472,1862-4480,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,SPRINGER HEIDELBERG,NA +optimization methods & software,1055-6788,1029-4937,NA,0,0,1,0,"Computer Science, Software Engineering | Operations Research & Management Science | Mathematics, Applied",NA,NA,TAYLOR & FRANCIS LTD,NA +opto-electronic advances,2096-4579,2096-4579,OptoElectronAdv,0,0,1,1,Optics,NA,NA,"CHINESE ACAD SCI, INST OPTICS & ELECTRONICS, ED OFF OPTO-ELECTRONIC ADV",2020-12-09 +opto-electronics review,1230-3402,1896-3757,NA,0,0,1,0,"Engineering, Electrical & Electronic | Optics | Physics, Applied",NA,NA,POLISH ACAD SCIENCES,NA +optoelectronics and advanced materials-rapid communications,1842-6573,2065-3824,NA,0,0,1,0,"Materials Science, Multidisciplinary | Optics",NA,NA,"NATL INST OPTOELECTRONICS",NA +optometry and vision science,1040-5488,1538-9235,NA,0,0,1,0,Ophthalmology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +opuscula-annual of the swedish institutes at athens and rome,2000-0898,NA,NA,1,0,0,0,NA,NA,Archaeology,EDITORIAL COMMITTEE SWEDISH INST ATHENS & ROME,NA +or spectrum,0171-6468,1436-6304,NA,0,0,1,0,Operations Research & Management Science,NA,NA,SPRINGER,NA +oral and maxillofacial surgery clinics of north america,1042-3699,1558-1365,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +oral diseases,1354-523X,1601-0825,J_OralDiseases,0,0,1,1,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,2022-02-03 +oral health & preventive dentistry,1602-1622,1757-9996,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +oral history review,0094-0798,1533-8592,oralhistreview,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-05-09 +oral history review,0094-0798,1533-8592,oralhistreview,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-05-09 +oral oncology,1368-8375,1879-0593,NA,0,0,1,0,"Oncology | Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER,NA +oral radiology,0911-6028,1613-9674,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,SPRINGER,NA +oral surgery oral medicine oral pathology oral radiology,2212-4403,1528-395X,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER SCIENCE INC,NA +orbis litterarum,0105-7510,1600-0730,NA,1,0,0,0,NA,NA,Literature,WILEY,NA +order-a journal on the theory of ordered sets and its applications,0167-8094,1572-9273,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +ore geology reviews,0169-1368,1872-7360,NA,0,0,1,0,Geology | Mineralogy | Mining & Mineral Processing,NA,NA,ELSEVIER,NA +oregon historical quarterly,0030-4727,NA,NA,1,0,0,0,NA,NA,History,OREGON HISTORICAL SOC,NA +organic & biomolecular chemistry,1477-0520,1477-0539,NA,0,0,1,0,"Chemistry, Organic",NA,NA,ROYAL SOC CHEMISTRY,NA +organic chemistry frontiers,2052-4129,2052-4129,NA,0,0,1,0,"Chemistry, Organic",NA,NA,ROYAL SOC CHEMISTRY,NA +organic electronics,1566-1199,1878-5530,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER,NA +organic geochemistry,0146-6380,1873-5290,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +organic letters,1523-7060,1523-7052,NA,0,0,1,0,"Chemistry, Organic",NA,NA,AMER CHEMICAL SOC,NA +organic preparations and procedures international,0030-4948,1945-5453,NA,0,0,1,0,"Chemistry, Organic",NA,NA,TAYLOR & FRANCIS INC,NA +organic process research & development,1083-6160,1520-586X,OPRD_ACS,0,0,1,1,"Chemistry, Applied | Chemistry, Organic",NA,NA,AMER CHEMICAL SOC,2019-01-31 +organised sound,1355-7718,1469-8153,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +organisms diversity & evolution,1439-6092,1618-1077,NA,0,0,1,0,Evolutionary Biology | Zoology,NA,NA,SPRINGER HEIDELBERG,NA +organization,1350-5084,1461-7323,NA,0,1,0,0,NA,Management,NA,SAGE PUBLICATIONS LTD,NA +organization & environment,1086-0266,1552-7417,NA,0,1,0,0,NA,Environmental Studies | Management,NA,SAGE PUBLICATIONS INC,NA +organization science,1047-7039,1526-5455,OrganizationSci,0,1,0,1,NA,Management,NA,INFORMS,2014-09-08 +organization studies,0170-8406,1741-3044,osofficer,0,1,0,1,NA,Management,NA,SAGE PUBLICATIONS LTD,2012-11-11 +organizational behavior and human decision processes,0749-5978,1095-9920,NA,0,1,0,0,NA,"Psychology, Applied | Management | Psychology, Social",NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +organizational dynamics,0090-2616,1873-3530,NA,0,1,0,0,NA,"Business | Psychology, Applied | Management",NA,ELSEVIER SCIENCE INC,NA +organizational psychology review,2041-3866,2041-3874,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,SAGE PUBLICATIONS INC,NA +organizational research methods,1094-4281,1552-7425,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,SAGE PUBLICATIONS INC,NA +organogenesis,1547-6278,1555-8592,NA,0,0,1,0,"Biochemistry & Molecular Biology | Developmental Biology | Engineering, Biomedical",NA,NA,TAYLOR & FRANCIS INC,NA +organometallics,0276-7333,1520-6041,Orgmet_ACS,0,0,1,1,"Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,AMER CHEMICAL SOC,2014-12-18 +organon f,1335-0668,2585-7150,NA,1,0,0,0,NA,NA,Philosophy,INST PHILOSOPHY SLOVAK ACAD SCIENCES & INST PHILOSOPHY CZECH ACAD SCIENCES,NA +oriens,0078-6527,1877-8372,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",BRILL,NA +oriental insects,0030-5316,2157-8745,NA,0,0,1,0,Entomology,NA,NA,TAYLOR & FRANCIS LTD,NA +origini,0474-6805,NA,NA,1,0,0,0,NA,NA,Archaeology,GANGEMI EDITORE S P A,NA +origins of life and evolution of biospheres,0169-6149,1573-0875,NA,0,0,1,0,Biology,NA,NA,SPRINGER,NA +orl-journal for oto-rhino-laryngology head and neck surgery,0301-1569,1423-0275,NA,0,0,1,0,Otorhinolaryngology,NA,NA,KARGER,NA +ornis fennica,0030-5685,0030-5685,OrnisF,0,0,1,1,Ornithology,NA,NA,BIRDLIFE FINLAND,2015-09-02 +ornithological applications,0010-5422,2732-4621,NA,0,0,1,0,Ornithology,NA,NA,OXFORD UNIV PRESS INC,NA +ornithological science,1347-0558,1347-0558,OrnithSci,0,0,1,1,Ornithology,NA,NA,"ORNITHOLOGICAL SOC JAPAN, UNIV TOKYO, SCH AGR",2014-08-23 +ornithology,0004-8038,2732-4613,NA,0,0,1,0,Ornithology,NA,NA,OXFORD UNIV PRESS INC,NA +ornithology research,NA,2662-673X,NA,0,0,1,0,Ornithology,NA,NA,SPRINGERNATURE,NA +ornitologia neotropical,1075-4377,1075-4377,ONeotropical,0,0,1,1,Ornithology,NA,NA,"NEOTROPICAL ORNITHOLOGICAL SOC, USGS PATUXENT WILDLIFE RESEARCH CTR",2019-10-08 +orphanet journal of rare diseases,1750-1172,1750-1172,ojrarediseases,0,0,1,1,"Genetics & Heredity | Medicine, Research & Experimental",NA,NA,BMC,2016-01-22 +orthodontics & craniofacial research,1601-6335,1601-6343,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +orthopade,0085-4530,1433-0431,NA,0,0,1,0,Orthopedics,NA,NA,SPRINGER,NA +orthopaedic journal of sports medicine,2325-9671,2325-9671,OJSM_SportsMed,0,0,1,1,Orthopedics | Sport Sciences,NA,NA,SAGE PUBLICATIONS INC,2015-02-18 +orthopaedic nursing,0744-6020,1542-538X,ONJonline,0,1,1,1,Nursing | Orthopedics,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-10-27 +orthopaedic nursing,0744-6020,1542-538X,ONJonline,0,1,1,1,Nursing | Orthopedics,Nursing,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-10-27 +orthopaedic surgery,1757-7853,1757-7861,NA,0,0,1,0,Orthopedics,NA,NA,WILEY,NA +orthopaedics & traumatology-surgery & research,1877-0568,1877-0568,NA,0,0,1,0,Orthopedics | Surgery,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",NA +orthopedic clinics of north america,0030-5898,1558-1373,NA,0,0,1,0,Orthopedics,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +orthopedics,0147-7447,1938-2367,NA,0,0,1,0,Orthopedics,NA,NA,SLACK INC,NA +orvosi hetilap,0030-6002,1788-6120,OrvosiH,0,0,1,1,"Medicine, General & Internal",NA,NA,AKADEMIAI KIADO ZRT,2020-07-18 +oryx,0030-6053,1365-3008,OryxTheJournal,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,CAMBRIDGE UNIV PRESS,2009-11-30 +osaka journal of mathematics,0030-6126,NA,NA,0,0,1,0,Mathematics,NA,NA,OSAKA JOURNAL OF MATHEMATICS,NA +osiris,0369-7827,1933-8287,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,NA +osiris,0369-7827,1933-8287,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,NA +osiris,0369-7827,1933-8287,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,NA +osmanli arastirmalari-the journal of ottoman studies,0255-0636,0255-0636,NA,1,0,0,0,NA,NA,History | Asian Studies,ISTANBUL 29 MAYIS UNIV & ISAM,NA +osteoarthritis and cartilage,1063-4584,1522-9653,NA,0,0,1,0,Orthopedics | Rheumatology,NA,NA,ELSEVIER SCI LTD,NA +osteoporosis international,0937-941X,1433-2965,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER LONDON LTD,NA +osterreichische zeitschrift fur volkskunde,0029-9669,NA,NA,1,0,0,0,NA,NA,Folklore,VEREIN FUR VOLKSKUNDE,NA +osteuropa,0030-6428,2509-3444,zosteuropa,0,1,0,1,NA,Political Science,NA,BWV-BERLINER WISSENSCHAFTS-VERLAG GMBH,2018-11-29 +ostrich,0030-6525,1727-947X,NA,0,0,1,0,Ornithology,NA,NA,TAYLOR & FRANCIS LTD,NA +otjr-occupation participation and health,1539-4492,1938-2383,OTJRJournal,0,1,0,1,NA,Rehabilitation,NA,SAGE PUBLICATIONS INC,2016-09-20 +otolaryngologic clinics of north america,0030-6665,1557-8259,NA,0,0,1,0,Otorhinolaryngology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +otolaryngology-head and neck surgery,0194-5998,1097-6817,NA,0,0,1,0,Otorhinolaryngology | Surgery,NA,NA,SAGE PUBLICATIONS INC,NA +otology & neurotology,1531-7129,1537-4505,OandNonline,0,0,1,1,Clinical Neurology | Otorhinolaryngology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-28 +oud holland,0030-672X,1875-0176,oud_holland_,1,0,0,1,NA,NA,Art,BRILL,2019-02-22 +outlook on agriculture,0030-7270,2043-6866,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,SAGE PUBLICATIONS LTD,NA +overland,0030-7416,NA,OverlandJournal,1,0,0,1,NA,NA,Literary Reviews,O L SOCIETY LTD,2009-02-26 +oxford art journal,0142-6540,1741-7287,NA,1,0,0,0,NA,NA,Art,OXFORD UNIV PRESS,NA +oxford bulletin of economics and statistics,0305-9049,1468-0084,NA,0,1,1,0,Statistics & Probability,"Economics | Social Sciences, Mathematical Methods",NA,WILEY,NA +oxford bulletin of economics and statistics,0305-9049,1468-0084,NA,0,1,1,0,Statistics & Probability,"Economics | Social Sciences, Mathematical Methods",NA,WILEY,NA +oxford economic papers-new series,0030-7653,1464-3812,NA,0,1,0,0,NA,Economics,NA,OXFORD UNIV PRESS,NA +oxford german studies,0078-7191,1745-9214,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +oxford journal of archaeology,0262-5253,1468-0092,NA,1,0,0,0,NA,NA,Archaeology,WILEY,NA +oxford journal of legal studies,0143-6503,1464-3820,NA,0,1,0,0,NA,Law,NA,OXFORD UNIV PRESS,NA +oxford literary review,0305-1498,1757-1634,NA,1,0,0,0,NA,NA,Philosophy | Literary Theory & Criticism,EDINBURGH UNIV PRESS,NA +oxford review of economic policy,0266-903X,1460-2121,NA,0,1,0,0,NA,Economics,NA,OXFORD UNIV PRESS,NA +oxford review of education,0305-4985,1465-3915,OxfordRevEd,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-05-21 +oxidation of metals,0030-770X,1573-4889,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +oxidative medicine and cellular longevity,1942-0900,1942-0994,NA,0,0,1,0,Cell Biology,NA,NA,HINDAWI LTD,NA +ozone-science & engineering,0191-9512,1547-6545,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,TAYLOR & FRANCIS INC,NA +pace-pacing and clinical electrophysiology,0147-8389,1540-8159,pace_journal,0,0,1,1,"Cardiac & Cardiovascular System | Engineering, Biomedical",NA,NA,WILEY,2018-11-02 +pachyderm,1026-2881,NA,NA,0,0,1,0,Biodiversity Conservation | Zoology,NA,NA,IUCN-SSC ASIAN ELEPHANT SPECIALIST GROUP,NA +pacific-basin finance journal,0927-538X,1879-0585,NA,0,1,0,0,NA,"Business, Finance",NA,ELSEVIER,NA +pacific affairs,0030-851X,1715-3379,pacificaffairs,0,1,0,1,NA,Area Studies,NA,PACIFIC AFFAIRS UNIV BRITISH COLUMBIA,2009-11-18 +pacific economic review,1361-374X,1468-0106,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +pacific focus,1225-4657,1976-5118,NA,0,1,0,0,NA,Area Studies | International Relations,NA,WILEY,NA +pacific historical review,0030-8684,1533-8584,PacHistReview,1,0,0,1,NA,NA,History,UNIV CALIFORNIA PRESS,2015-11-05 +pacific journal of mathematics,0030-8730,0030-8730,NA,0,0,1,0,Mathematics,NA,NA,PACIFIC JOURNAL MATHEMATICS,NA +pacific journal of optimization,1348-9151,1348-9151,NA,0,0,1,0,"Operations Research & Management Science | Mathematics, Applied",NA,NA,YOKOHAMA PUBL,NA +pacific northwest quarterly,0030-8803,NA,NA,1,0,0,0,NA,NA,History,UNIV WASHINGTON,NA +pacific philosophical quarterly,0279-0750,1468-0114,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +pacific review,0951-2748,1470-1332,reviewpacific,0,1,0,1,NA,Area Studies | International Relations,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-07-01 +pacific science,0030-8870,1534-6188,NA,0,0,1,0,Marine & Freshwater Biology | Zoology,NA,NA,UNIV HAWAII PRESS,NA +packaging technology and science,0894-3214,1099-1522,NA,0,0,1,0,"Engineering, Manufacturing | Food Science & Technology",NA,NA,WILEY,NA +paddy and water environment,1611-2490,1611-2504,NA,0,0,1,0,Agricultural Engineering | Agronomy,NA,NA,SPRINGER HEIDELBERG,NA +paedagogica historica,0030-9230,1477-674X,PH_Journal,0,1,0,1,NA,Education & Educational Research | History Of Social Sciences,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-05-24 +paediatric and perinatal epidemiology,0269-5022,1365-3016,NA,0,0,1,0,"Public, Environmental & Occupational Health | Obstetrics & Gynecology | Pediatrics",NA,NA,WILEY,NA +paediatric respiratory reviews,1526-0542,1526-0550,NA,0,0,1,0,Pediatrics | Respiratory System,NA,NA,ELSEVIER SCI LTD,NA +paediatrics & child health,1205-7088,1918-1485,PaedCH,0,0,1,1,Pediatrics,NA,NA,OXFORD UNIV PRESS INC,2015-07-14 +paediatrics and international child health,2046-9047,2046-9055,NA,0,0,1,0,Pediatrics,NA,NA,TAYLOR & FRANCIS LTD,NA +paideuma,0090-5674,0090-5674,NA,1,0,0,0,NA,NA,Poetry,"NATL POETRY FOUNDATION",NA +pain,0304-3959,1872-6623,PAINthejournal,0,0,1,1,Anesthesiology | Clinical Neurology | Neurosciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2013-11-14 +pain and therapy,2193-8237,2193-651X,Pain_Ther,0,0,1,1,Clinical Neurology,NA,NA,SPRINGER INT PUBL AG,2017-06-05 +pain management nursing,1524-9042,1532-8635,PMN_Journal,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,2017-08-13 +pain management nursing,1524-9042,1532-8635,PMN_Journal,0,1,1,1,Nursing,Nursing,NA,ELSEVIER SCIENCE INC,2017-08-13 +pain medicine,1526-2375,1526-4637,PainMedJournal,0,0,1,1,"Anesthesiology | Medicine, General & Internal",NA,NA,OXFORD UNIV PRESS,2016-09-21 +pain physician,1533-3159,2150-1149,PainPhysician1,0,0,1,1,Anesthesiology | Clinical Neurology,NA,NA,AM SOC INTERVENTIONAL PAIN PHYSICIANS,2012-03-19 +pain practice,1530-7085,1533-2500,NA,0,0,1,0,Anesthesiology | Clinical Neurology,NA,NA,WILEY,NA +pain research & management,1203-6765,1918-1523,NA,0,0,1,0,Clinical Neurology,NA,NA,HINDAWI LTD,NA +paj-a journal of performance and art,1520-281X,1537-9477,NA,1,0,0,0,NA,NA,Theater,MIT PRESS,NA +pakistan journal of agricultural sciences,0552-9034,2076-0906,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,"UNIV AGRICULTURE, FAC VETERINARY SCIENCE",NA +pakistan journal of botany,0556-3321,2070-3368,NA,0,0,1,0,Plant Sciences,NA,NA,PAKISTAN BOTANICAL SOC,NA +pakistan journal of medical sciences,1682-024X,1681-715X,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,PROFESSIONAL MEDICAL PUBLICATIONS,NA +pakistan journal of pharmaceutical sciences,1011-601X,1011-601X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,UNIV KARACHI,NA +pakistan journal of zoology,0030-9923,NA,NA,0,0,1,0,Zoology,NA,NA,ZOOLOGICAL SOC PAKISTAN,NA +pakistan veterinary journal,0253-8318,2074-7764,NA,0,0,1,0,Veterinary Sciences,NA,NA,"UNIV AGRICULTURE, FAC VETERINARY SCIENCE",NA +palaeobiodiversity and palaeoenvironments,1867-1594,1867-1608,NA,0,0,1,0,Biodiversity Conservation | Paleontology,NA,NA,SPRINGER HEIDELBERG,NA +palaeogeography palaeoclimatology palaeoecology,0031-0182,1872-616X,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary | Paleontology",NA,NA,ELSEVIER,NA +palaeontographica abteilung a-palaozoologie-stratigraphie,0375-0442,0375-0442,NA,0,0,1,0,Paleontology,NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +palaeontographica abteilung b-palaeophytologie palaeobotany-palaeophytology,2194-900X,2509-839X,NA,0,0,1,0,Paleontology,NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +palaeontologia electronica,1935-3952,1094-8074,PalaeoE,0,0,1,1,Paleontology,NA,NA,COQUINA PRESS,2012-03-31 +palaeontology,0031-0239,1475-4983,NA,0,0,1,0,Paleontology,NA,NA,WILEY,NA +palaeoworld,1871-174X,1875-5887,NA,0,0,1,0,Paleontology,NA,NA,ELSEVIER,NA +palaios,0883-1351,1938-5323,PALAIOS_Journal,0,0,1,1,Geology | Paleontology,NA,NA,SEPM-SOC SEDIMENTARY GEOLOGY,2019-04-16 +paleobiology,0094-8373,1938-5331,NA,0,0,1,0,Biodiversity Conservation | Ecology | Evolutionary Biology | Paleontology,NA,NA,CAMBRIDGE UNIV PRESS,NA +paleoceanography and paleoclimatology,2572-4517,2572-4525,NA,0,0,1,0,"Geosciences, Multidisciplinary | Oceanography | Paleontology",NA,NA,AMER GEOPHYSICAL UNION,NA +paleontological journal,0031-0301,1555-6174,NA,0,0,1,0,Paleontology,NA,NA,PLEIADES PUBLISHING INC,NA +paleontological research,1342-8144,1880-0068,NA,0,0,1,0,Paleontology,NA,NA,PALAEONTOLOGICAL SOC JAPAN,NA +palestine exploration quarterly,0031-0328,1743-1301,NA,1,0,0,0,NA,NA,History | Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +palliative & supportive care,1478-9515,1478-9523,NA,0,1,0,0,NA,Health Policy & Services,NA,CAMBRIDGE UNIV PRESS,NA +palliative medicine,0269-2163,1477-030X,PalliativeMedJ,0,0,1,1,"Health Care Sciences & Services | Public, Environmental & Occupational Health | Medicine, General & Internal",NA,NA,SAGE PUBLICATIONS LTD,2011-06-13 +palynology,0191-6122,1558-9188,NA,0,0,1,0,Plant Sciences | Paleontology,NA,NA,TAYLOR & FRANCIS INC,NA +palz,0031-0220,1867-6812,NA,0,0,1,0,Paleontology,NA,NA,SPRINGER HEIDELBERG,NA +pamatky archeologicke,0031-0506,2570-9496,NA,1,0,0,0,NA,NA,Archaeology,"ACAD SCIENCES CZECH REP, INST ARCHAEOLOGY",NA +pamietnik literacki,0031-0514,0031-0514,NA,1,0,0,0,NA,NA,"Literature, Slavic","WYDAWNICTWO PAN, INST BADAN LITERACKICH PAN",NA +pan-pacific entomologist,0031-0603,2162-0237,NA,0,0,1,0,Entomology,NA,NA,PACIFIC COAST ENTOMOL SOC,NA +pancreas,0885-3177,1536-4828,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +pancreatology,1424-3903,1424-3911,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,ELSEVIER,NA +panminerva medica,0031-0808,1827-1898,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,EDIZIONI MINERVA MEDICA,NA +panoeconomicus,1452-595X,2217-2386,NA,0,1,0,0,NA,Economics,NA,SAVEZ EKONOMISTA VOJVODINE,NA +papeles de poblacion,1405-7425,1405-7425,papeles_de,0,1,0,1,NA,Demography,NA,UNIV AUTONOMA ESTADO MEXICO,2021-04-29 +papers in palaeontology,2056-2799,2056-2802,NA,0,0,1,0,Paleontology,NA,NA,WILEY,NA +papers in regional science,1056-8190,1435-5957,NA,0,1,0,0,NA,Economics | Environmental Studies | Geography | Regional & Urban Planning,NA,WILEY,NA +papers of the bibliographical society of america,0006-128X,2377-6528,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV CHICAGO PRESS,NA +papers of the british school at rome,0068-2462,2045-239X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",CAMBRIDGE UNIV PRESS,NA +papers on language and literature,0031-1294,NA,papers_on,1,0,0,1,NA,NA,Literature | Literary Theory & Criticism | Language & Linguistics,SOUTHERN ILLINOIS UNIV,2019-08-24 +parabola,0362-1596,0362-1596,ParabolaMAG,1,0,0,1,NA,NA,Religion,"SOC STUDY MYTH & TRADITION, INC",2009-03-19 +paragraph,0264-8334,1750-0176,ParagraphEUP,1,0,0,1,NA,NA,Literature,EDINBURGH UNIV PRESS,2021-05-24 +parallax,1353-4645,1460-700X,ParallaxJournal,1,1,0,1,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-06-24 +parallax,1353-4645,1460-700X,ParallaxJournal,1,1,0,1,NA,Cultural Studies,Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-06-24 +parallel computing,0167-8191,1872-7336,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +parasite,1252-607X,1776-1042,ParasiteJournal,0,0,1,1,Parasitology,NA,NA,EDP SCIENCES S A,2012-12-21 +parasite immunology,0141-9838,1365-3024,NA,0,0,1,0,Immunology | Parasitology,NA,NA,WILEY,NA +parasites & vectors,1756-3305,1756-3305,bugbittentweets,0,0,1,1,Parasitology | Tropical Medicine,NA,NA,BMC,2013-09-06 +parasitology,0031-1820,1469-8161,JnlParasitology,0,0,1,1,Parasitology,NA,NA,CAMBRIDGE UNIV PRESS,2015-05-11 +parasitology international,1383-5769,1873-0329,NA,0,0,1,0,Parasitology,NA,NA,ELSEVIER IRELAND LTD,NA +parasitology research,0932-0113,1432-1955,NA,0,0,1,0,Parasitology,NA,NA,SPRINGER,NA +parenting-science and practice,1529-5192,1532-7922,NA,0,1,0,0,NA,"Family Studies | Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +parergon,0313-6221,1832-8334,ParergonJournal,1,0,0,1,NA,NA,Medieval & Renaissance Studies,AUSTRALIAN NZ ASSOC MEDIEVAL EARLY MODERN STUDIES,2020-09-23 +paris review,0031-2037,NA,parisreview,1,0,0,1,NA,NA,Literary Reviews,PARIS REVIEW,2009-09-03 +parkinsonism & related disorders,1353-8020,1873-5126,ParkinsonismD,0,0,1,1,Clinical Neurology,NA,NA,ELSEVIER SCI LTD,2019-04-13 +parkinsons disease,2090-8083,2042-0080,NA,0,0,1,0,Clinical Neurology,NA,NA,HINDAWI LTD,NA +parliamentary affairs,0031-2290,1460-2482,NA,0,1,0,0,NA,Political Science,NA,OXFORD UNIV PRESS,NA +parliamentary history,0264-2824,1750-0206,Parlhistjournal,1,0,0,1,NA,NA,History,WILEY,2019-12-01 +partial answers-journal of literature and the history of ideas,1565-3668,1936-9247,NA,1,0,0,0,NA,NA,Literary Theory & Criticism,HEBREW UNIV MAGNES PRESS,NA +particle & particle systems characterization,0934-0866,1521-4117,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +particle and fibre toxicology,1743-8977,1743-8977,NA,0,0,1,0,Toxicology,NA,NA,BMC,NA +particulate science and technology,0272-6351,1548-0046,NA,0,0,1,0,"Engineering, Chemical",NA,NA,TAYLOR & FRANCIS INC,NA +particuology,1674-2001,2210-4291,NA,0,0,1,0,"Engineering, Chemical | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCIENCE INC,NA +party politics,1354-0688,1460-3683,NA,0,1,0,0,NA,Political Science,NA,SAGE PUBLICATIONS LTD,NA +past & present,0031-2746,1477-464X,pastpresentsoc,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2012-05-14 +past & present,0031-2746,1477-464X,pastpresentsoc,1,1,0,1,NA,History,History,OXFORD UNIV PRESS,2012-05-14 +pathobiology,1015-2008,1423-0291,NA,0,0,1,0,Cell Biology | Pathology,NA,NA,KARGER,NA +pathogens,2076-0817,2076-0817,NA,0,0,1,0,Microbiology,NA,NA,MDPI,NA +pathogens and disease,2049-632X,2049-632X,NA,0,0,1,0,Immunology | Infectious Diseases | Microbiology,NA,NA,OXFORD UNIV PRESS,NA +pathogens and global health,2047-7724,2047-7732,NA,0,0,1,0,"Public, Environmental & Occupational Health | Parasitology | Tropical Medicine",NA,NA,TAYLOR & FRANCIS LTD,NA +pathologe,0172-8113,1432-1963,NA,0,0,1,0,Pathology,NA,NA,SPRINGER HEIDELBERG,NA +pathology,0031-3025,1465-3931,Pathology_RCPA,0,0,1,1,Pathology,NA,NA,ELSEVIER,2011-11-25 +pathology & oncology research,1219-4956,1532-2807,NA,0,0,1,0,Oncology | Pathology,NA,NA,FRONTIERS MEDIA SA,NA +pathology international,1320-5463,1440-1827,NA,0,0,1,0,Pathology,NA,NA,WILEY,NA +pathology research and practice,0344-0338,1618-0631,NA,0,0,1,0,Pathology,NA,NA,ELSEVIER GMBH,NA +patient-patient centered outcomes research,1178-1653,1178-1661,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,ADIS INT LTD,NA +patient-patient centered outcomes research,1178-1653,1178-1661,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,ADIS INT LTD,NA +patient education and counseling,0738-3991,1873-5134,NA,0,1,1,0,"Public, Environmental & Occupational Health","Social Sciences, Interdisciplinary",NA,ELSEVIER IRELAND LTD,NA +patient education and counseling,0738-3991,1873-5134,NA,0,1,1,0,"Public, Environmental & Occupational Health","Social Sciences, Interdisciplinary",NA,ELSEVIER IRELAND LTD,NA +patient preference and adherence,1177-889X,1177-889X,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,DOVE MEDICAL PRESS LTD,NA +pattern analysis and applications,1433-7541,1433-755X,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,SPRINGER,NA +pattern recognition,0031-3203,1873-5142,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,ELSEVIER SCI LTD,NA +pattern recognition letters,0167-8655,1872-7344,NA,0,0,1,0,"Computer Science, Artificial Intelligence",NA,NA,ELSEVIER,NA +patterns of prejudice,0031-322X,1461-7331,POP_Jrnl,1,1,0,1,NA,Ethnic Studies,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-11-06 +patterns of prejudice,0031-322X,1461-7331,POP_Jrnl,1,1,0,1,NA,Ethnic Studies,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-11-06 +pci journal,0887-9672,0887-9672,NA,0,0,1,0,Construction & Building Technology,NA,NA,PRECAST/PRESTRESSED CONCRETE INST,NA +peacebuilding,2164-7259,2164-7267,peacebuilding_,0,1,0,1,NA,International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2011-10-11 +pedagogische studien,0165-0645,0165-0645,PedagogischeStu,0,1,0,1,NA,Education & Educational Research,NA,VOR-VFO,2016-12-13 +pediatric allergy and immunology,0905-6157,1399-3038,PAI_Journal,0,0,1,1,Allergy | Immunology | Pediatrics,NA,NA,WILEY,2015-05-06 +pediatric allergy immunology and pulmonology,2151-321X,2151-3228,NA,0,0,1,0,Allergy | Immunology | Pediatrics | Respiratory System,NA,NA,"MARY ANN LIEBERT, INC",NA +pediatric and developmental pathology,1093-5266,1615-5742,NA,0,0,1,0,Pathology | Pediatrics,NA,NA,SAGE PUBLICATIONS INC,NA +pediatric anesthesia,1155-5645,1460-9592,PediatricAnest,0,0,1,1,Anesthesiology | Pediatrics,NA,NA,WILEY,2015-10-13 +pediatric annals,0090-4481,1938-2359,PediatricAnnals,0,0,1,1,Pediatrics,NA,NA,SLACK INC,2012-05-16 +pediatric blood & cancer,1545-5009,1545-5017,NA,0,0,1,0,Oncology | Hematology | Pediatrics,NA,NA,WILEY,NA +pediatric cardiology,0172-0643,1432-1971,NA,0,0,1,0,Cardiac & Cardiovascular System | Pediatrics,NA,NA,SPRINGER,NA +pediatric clinics of north america,0031-3955,1557-8240,NA,0,0,1,0,Pediatrics,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +pediatric critical care medicine,1529-7535,1947-3893,PedCritCareMed,0,0,1,1,Critical Care Medicine | Pediatrics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-10 +pediatric dentistry,0164-1263,1942-5473,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine | Pediatrics",NA,NA,AMER ACAD PEDIATRIC DENTISTRY,NA +pediatric dermatology,0736-8046,1525-1470,NA,0,0,1,0,Dermatology | Pediatrics,NA,NA,WILEY,NA +pediatric diabetes,1399-543X,1399-5448,NA,0,0,1,0,Endocrinology & Metabolism | Pediatrics,NA,NA,WILEY,NA +pediatric drugs,1174-5878,1179-2019,PediatricDrugs,0,0,1,1,Pediatrics | Pharmacology & Pharmacy,NA,NA,ADIS INT LTD,2019-03-19 +pediatric drugs,1174-5878,1179-2019,PediatricDrugs,0,0,1,1,Pediatrics | Pharmacology & Pharmacy,NA,NA,ADIS INT LTD,2019-03-19 +pediatric emergency care,0749-5161,1535-1815,PedCareonline,0,0,1,1,Emergency Medicine | Pediatrics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-10-27 +pediatric endocrinology reviews per,1565-4753,1565-4753,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,MEDICAL MEDIA,NA +pediatric exercise science,0899-8493,1543-2920,pesjournal,0,0,1,1,Pediatrics | Physiology | Sport Sciences,NA,NA,HUMAN KINETICS PUBL INC,2019-10-15 +pediatric hematology and oncology,0888-0018,1521-0669,NA,0,0,1,0,Oncology | Hematology | Pediatrics,NA,NA,TAYLOR & FRANCIS INC,NA +pediatric infectious disease journal,0891-3668,1532-0987,PIDJournal,0,0,1,1,Immunology | Infectious Diseases | Pediatrics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-07-20 +pediatric nephrology,0931-041X,1432-198X,Ped_Neph,0,0,1,1,Pediatrics | Urology & Nephrology,NA,NA,SPRINGER,2014-11-20 +pediatric neurology,0887-8994,1873-5150,NA,0,0,1,0,Clinical Neurology | Pediatrics,NA,NA,ELSEVIER SCIENCE INC,NA +pediatric neurosurgery,1016-2291,1423-0305,NA,0,0,1,0,Clinical Neurology | Pediatrics | Surgery,NA,NA,KARGER,NA +pediatric obesity,2047-6310,2047-6302,NA,0,0,1,0,Pediatrics,NA,NA,WILEY,NA +pediatric physical therapy,0898-5669,1538-005X,PedPTJournal,0,0,1,1,Pediatrics | Rehabilitation,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-06-04 +pediatric pulmonology,8755-6863,1099-0496,PedPulmonol,0,0,1,1,Pediatrics | Respiratory System,NA,NA,WILEY,2021-01-28 +pediatric radiology,0301-0449,1432-1998,PedRadJournal,0,0,1,1,"Pediatrics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,2016-01-29 +pediatric research,0031-3998,1530-0447,Ped_Research,0,0,1,1,Pediatrics,NA,NA,SPRINGERNATURE,2011-01-06 +pediatric rheumatology,1546-0096,1546-0096,NA,0,0,1,0,Pediatrics | Rheumatology,NA,NA,BMC,NA +pediatric surgery international,0179-0358,1437-9813,NA,0,0,1,0,Pediatrics | Surgery,NA,NA,SPRINGER,NA +pediatric transplantation,1397-3142,1399-3046,pedtransjrnl,0,0,1,1,Pediatrics | Transplantation,NA,NA,WILEY,2018-10-10 +pediatrics,0031-4005,1098-4275,aap_peds,0,0,1,1,Pediatrics,NA,NA,AMER ACAD PEDIATRICS,2018-11-16 +pediatrics and neonatology,1875-9572,2212-1692,NA,0,0,1,0,Pediatrics,NA,NA,ELSEVIER TAIWAN,NA +pediatrics international,1328-8067,1442-200X,NA,0,0,1,0,Pediatrics,NA,NA,WILEY,NA +pedobiologia,0031-4056,1873-1511,Pedo_Biologia,0,0,1,1,Ecology | Soil Science,NA,NA,ELSEVIER GMBH,2020-05-07 +pedosphere,1002-0160,2210-5107,NA,0,0,1,0,Soil Science,NA,NA,SCIENCE PRESS,NA +peer-to-peer networking and applications,1936-6442,1936-6450,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,SPRINGER,NA +peerj,2167-8359,2167-8359,PeerJLife,0,0,1,1,Multidisciplinary Sciences,NA,NA,PEERJ INC,2021-01-08 +peerj computer science,2376-5992,2376-5992,PeerJCompSci,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,PEERJ INC,2015-01-16 +pennsylvania magazine of history and biography,0031-4587,2169-8546,NA,1,0,0,0,NA,NA,History,UNIV PENNSYLVANIA PRESS,NA +pensamiento,0031-4749,2386-5822,NA,1,0,0,0,NA,NA,Philosophy,"UNIV PONTIFICIA COMILLAS MADRID, FAC FILOSOFIA",NA +peptide science,2475-8817,2475-8817,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,WILEY,NA +peptides,0196-9781,1873-5169,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism | Pharmacology & Pharmacy,NA,NA,ELSEVIER SCIENCE INC,NA +perception,0301-0066,1468-4233,NA,0,1,1,0,Ophthalmology | Psychology,"Psychology, Experimental",NA,SAGE PUBLICATIONS LTD,NA +perception,0301-0066,1468-4233,NA,0,1,1,0,Ophthalmology | Psychology,"Psychology, Experimental",NA,SAGE PUBLICATIONS LTD,NA +perceptual and motor skills,0031-5125,1558-688X,NA,0,1,0,0,NA,"Psychology, Experimental",NA,SAGE PUBLICATIONS INC,NA +perfiles latinoamericanos,0188-7653,2309-4982,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,FLACSO-MEXICO,NA +performance evaluation,0166-5316,1872-745X,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +performance research,1352-8165,1469-9990,theprjournal,1,0,0,1,NA,NA,Theater,TAYLOR & FRANCIS LTD,2014-11-18 +perfusion-uk,0267-6591,1477-111X,NA,0,0,1,0,Cardiac & Cardiovascular System | Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS LTD,NA +perinola-revista de investigacion quevediana,1138-6363,1138-6363,LaPerinola_unav,1,0,0,1,NA,NA,"Literature, Romance","UNIV NAVARRA, SERVICIO PUBLICACIONES",2019-08-20 +periodica mathematica hungarica,0031-5303,1588-2829,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER,NA +periodica polytechnica-chemical engineering,0324-5853,1587-3765,NA,0,0,1,0,"Engineering, Chemical",NA,NA,BUDAPEST UNIV TECHNOLOGY ECONOMICS,NA +periodica polytechnica-civil engineering,0553-6626,1587-3773,NA,0,0,1,0,"Engineering, Civil",NA,NA,BUDAPEST UNIV TECHNOLOGY ECONOMICS,NA +periodico di mineralogia,0369-8963,NA,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,EDIZIONI NUOVA CULTURA,NA +periodicum biologorum,0031-5362,1849-0964,NA,0,0,1,0,Biology,NA,NA,PERIODICUM BIOLOGORUM,NA +periodontology 2000,0906-6713,1600-0757,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,WILEY,NA +perioperative medicine,2047-0525,2047-0525,PeriOpMedJ,0,0,1,1,Surgery | Anesthesiology,NA,NA,BMC,2019-07-10 +peritoneal dialysis international,0896-8608,1718-4304,PDI_Journal,0,0,1,1,Urology & Nephrology,NA,NA,SAGE PUBLICATIONS INC,2015-04-07 +permafrost and periglacial processes,1045-6740,1099-1530,NA,0,0,1,0,"Geography, Physical | Geology",NA,NA,WILEY,NA +personal and ubiquitous computing,1617-4909,1617-4917,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,SPRINGER LONDON LTD,NA +personal relationships,1350-4126,1475-6811,joperrel,0,1,0,1,NA,"Communication | Family Studies | Psychology, Social",NA,WILEY,2020-12-07 +personality and individual differences,0191-8869,1873-3549,NA,0,1,0,0,NA,"Psychology, Social",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +personality and mental health,1932-8621,1932-863X,NA,0,1,0,0,NA,"Psychiatry | Psychology, Social",NA,WILEY,NA +personality and social psychology bulletin,0146-1672,1552-7433,NA,0,1,0,0,NA,"Psychology, Social",NA,SAGE PUBLICATIONS INC,NA +personality and social psychology review,1088-8683,1532-7957,NA,0,1,0,0,NA,"Psychology, Social",NA,SAGE PUBLICATIONS INC,NA +personality disorders-theory research and treatment,1949-2715,1949-2723,NA,0,1,0,0,NA,"Psychology, Clinical",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +personalized medicine,1741-0541,1744-828X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,FUTURE MEDICINE LTD,NA +personnel psychology,0031-5826,1744-6570,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,WILEY,NA +personnel review,0048-3486,1758-6933,PersonnelReview,0,1,0,1,NA,"Industrial Relations & Labor | Psychology, Applied | Management",NA,EMERALD GROUP PUBLISHING LTD,2021-11-23 +persoonia,0031-5850,1878-9080,NA,0,0,1,0,Mycology,NA,NA,RIJKSHERBARIUM,NA +perspective-actualite en histoire de l art,1777-7852,1777-7852,NA,1,0,0,0,NA,NA,Art,ARMAND COLIN,NA +perspectives-studies in translation theory and practice,0907-676X,1747-6623,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +perspectives-studies in translation theory and practice,0907-676X,1747-6623,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +perspectives in biology and medicine,0031-5982,1529-8795,NA,0,0,1,0,"History & Philosophy Of Science | Medicine, Research & Experimental",NA,NA,JOHNS HOPKINS UNIV PRESS,NA +perspectives in ecology and conservation,2530-0644,2530-0644,NA,0,0,1,0,Biodiversity Conservation,NA,NA,ELSEVIER SCI LTD,NA +perspectives in plant ecology evolution and systematics,1433-8319,1433-8319,NA,0,0,1,0,Plant Sciences | Ecology,NA,NA,ELSEVIER GMBH,NA +perspectives in psychiatric care,0031-5990,1744-6163,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,WILEY,NA +perspectives in psychiatric care,0031-5990,1744-6163,NA,0,1,1,0,Nursing | Psychiatry,Nursing | Psychiatry,NA,WILEY,NA +perspectives in public health,1757-9139,1757-9147,RSPH_PPH,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS LTD,2012-09-21 +perspectives on behavior science,2520-8969,2520-8977,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SPRINGER INT PUBL AG,NA +perspectives on medical education,2212-2761,2212-277X,pmeded,0,0,1,1,"Education, Scientific Disciplines | Health Care Sciences & Services",NA,NA,SPRINGERNATURE,2015-11-24 +perspectives on politics,1537-5927,1541-0986,poppublicsphere,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2014-09-09 +perspectives on psychological science,1745-6916,1745-6924,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS LTD,NA +perspectives on sexual and reproductive health,1538-6341,1931-2393,PSRHjournal,0,1,0,1,NA,Demography | Family Studies,NA,WILEY,2017-07-25 +pervasive and mobile computing,1574-1192,1873-1589,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,ELSEVIER,NA +pesquisa agropecuaria brasileira,0100-204X,1678-3921,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,EMPRESA BRASIL PESQ AGROPEC,NA +pesquisa veterinaria brasileira,0100-736X,1678-5150,NA,0,0,1,0,Veterinary Sciences,NA,NA,REVISTA PESQUISA VETERINARIA BRASILEIRA,NA +pest management science,1526-498X,1526-4998,NA,0,0,1,0,Agronomy | Entomology,NA,NA,JOHN WILEY & SONS LTD,NA +pesticide biochemistry and physiology,0048-3575,1095-9939,NA,0,0,1,0,Biochemistry & Molecular Biology | Entomology | Physiology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +petroleum chemistry,0965-5441,1555-6239,NA,0,0,1,0,"Chemistry, Organic | Chemistry, Physical | Energy & Fuels | Engineering, Chemical | Engineering, Petroleum",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +petroleum exploration and development,1000-0747,NA,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum | Geosciences, Multidisciplinary",NA,NA,KEAI PUBLISHING LTD,NA +petroleum geoscience,1354-0793,2041-496X,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,GEOLOGICAL SOC PUBL HOUSE,NA +petroleum science,1672-5107,1995-8226,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum",NA,NA,KEAI PUBLISHING LTD,NA +petroleum science and technology,1091-6466,1532-2459,NA,0,0,1,0,"Energy & Fuels | Engineering, Chemical | Engineering, Petroleum",NA,NA,TAYLOR & FRANCIS INC,NA +petrology,0869-5911,1556-2085,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,PLEIADES PUBLISHING INC,NA +petrophysics,1529-9074,1529-9074,NA,0,0,1,0,"Geochemistry & Geophysics | Engineering, Petroleum",NA,NA,SOC PETROPHYSICISTS & WELL LOG ANALYSTS-SPWLA,NA +pferdeheilkunde,0177-7726,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,HIPPIATRIKA VERLAG MBH,NA +pfg-journal of photogrammetry remote sensing and geoinformation science,2512-2789,2512-2819,NA,0,0,1,0,Remote Sensing | Imaging Science & Photographic Technology,NA,NA,SPRINGER INT PUBL AG,NA +pflege,1012-5302,1664-283X,NA,0,1,1,0,Nursing,Nursing,NA,HOGREFE AG-HOGREFE AG SUISSE,NA +pflege,1012-5302,1664-283X,NA,0,1,1,0,Nursing,Nursing,NA,HOGREFE AG-HOGREFE AG SUISSE,NA +pflugers archiv-european journal of physiology,0031-6768,1432-2013,PflugersArchiv,0,0,1,1,Physiology,NA,NA,SPRINGER HEIDELBERG,2020-12-15 +pharmaceutical biology,1388-0209,1744-5116,NA,0,0,1,0,Plant Sciences | Medical Laboratory Technology | Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,NA +pharmaceutical chemistry journal,0091-150X,1573-9031,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,SPRINGER,NA +pharmaceutical development and technology,1083-7450,1097-9867,Pharm_Dev_Tech,0,0,1,1,Pharmacology & Pharmacy,NA,NA,TAYLOR & FRANCIS LTD,2020-04-28 +pharmaceutical research,0724-8741,1573-904X,NA,0,0,1,0,"Chemistry, Multidisciplinary | Pharmacology & Pharmacy",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +pharmaceutical statistics,1539-1604,1539-1612,NA,0,0,1,0,Pharmacology & Pharmacy | Statistics & Probability,NA,NA,WILEY,NA +pharmaceuticals,1424-8247,1424-8247,Pharmaceut_MDPI,0,0,1,1,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,MDPI,2016-02-18 +pharmaceutics,1999-4923,1999-4923,MDPIpharma,0,0,1,1,Pharmacology & Pharmacy,NA,NA,MDPI,2015-07-02 +pharmacoeconomics,1170-7690,1179-2027,ph_economics,0,1,1,1,Health Care Sciences & Services | Pharmacology & Pharmacy,Economics | Health Policy & Services,NA,ADIS INT LTD,2010-07-05 +pharmacoeconomics,1170-7690,1179-2027,ph_economics,0,1,1,1,Health Care Sciences & Services | Pharmacology & Pharmacy,Economics | Health Policy & Services,NA,ADIS INT LTD,2010-07-05 +pharmacoepidemiology and drug safety,1053-8569,1099-1557,NA,0,0,1,0,"Public, Environmental & Occupational Health | Pharmacology & Pharmacy",NA,NA,WILEY,NA +pharmacogenetics and genomics,1744-6872,1744-6880,NA,0,0,1,0,Biotechnology & Applied Microbiology | Genetics & Heredity | Pharmacology & Pharmacy,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +pharmacogenomics,1462-2416,1744-8042,PGSjournal,0,0,1,1,Pharmacology & Pharmacy,NA,NA,FUTURE MEDICINE LTD,2014-01-22 +pharmacogenomics & personalized medicine,1178-7066,1178-7066,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,DOVE MEDICAL PRESS LTD,NA +pharmacogenomics journal,1470-269X,1473-1150,NA,0,0,1,0,Genetics & Heredity | Pharmacology & Pharmacy,NA,NA,SPRINGERNATURE,NA +pharmacognosy magazine,0973-1296,0976-4062,NA,0,0,1,0,"Chemistry, Medicinal",NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +pharmacological reports,1734-1140,2299-5684,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,SPRINGER HEIDELBERG,NA +pharmacological research,1043-6618,1096-1186,PharmacolRes,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,2022-02-10 +pharmacological reviews,0031-6997,1521-0081,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,AMER SOC PHARMACOLOGY EXPERIMENTAL THERAPEUTICS,NA +pharmacology,0031-7012,1423-0313,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,KARGER,NA +pharmacology & therapeutics,0163-7258,1879-016X,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +pharmacology biochemistry and behavior,0091-3057,1873-5177,NA,0,0,1,0,Behavioral Sciences | Neurosciences | Pharmacology & Pharmacy,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +pharmacology research & perspectives,2052-1707,2052-1707,PRandP_Journal,0,0,1,1,Pharmacology & Pharmacy,NA,NA,JOHN WILEY & SONS LTD,2017-08-02 +pharmacopsychiatry,0176-3679,1439-0795,Pharmacopsy,0,0,1,1,Pharmacology & Pharmacy | Psychiatry,NA,NA,GEORG THIEME VERLAG KG,2019-01-31 +pharmacotherapy,0277-0008,1875-9114,PharmacoJournal,0,0,1,1,Pharmacology & Pharmacy,NA,NA,WILEY,2015-09-16 +pharmazie,0031-7144,0031-7144,NA,0,0,1,0,"Chemistry, Medicinal | Chemistry, Multidisciplinary | Pharmacology & Pharmacy",NA,NA,AVOXA-MEDIENGRUPPE DEUTSCHER APOTHEKER GMBH,NA +phase transitions,0141-1594,1029-0338,NA,0,0,1,0,"Crystallography | Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,NA +phenomenology and the cognitive sciences,1568-7759,1572-8676,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +phi delta kappan,0031-7217,1940-6487,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +philippine agricultural scientist,0031-7454,NA,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,UNIV PHILIPPINES LOS BANOS,NA +philippine journal of crop science,0115-463X,NA,NA,0,0,1,0,Agronomy,NA,NA,CROP SCIENCE SOC PHILLIPPINES,NA +philological quarterly,0031-7977,NA,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,UNIV IOWA,NA +philologus,0031-7985,2196-7008,NA,1,0,0,0,NA,NA,Classics,WALTER DE GRUYTER GMBH,NA +philosophers imprint,1533-628X,1533-628X,PhilosophersIm1,1,0,0,1,NA,NA,Philosophy,"UNIV MICHIGAN LIBRARY, MPUBLISHING",2019-02-03 +philosophia,0048-3893,1574-9274,SayWhatSOPHIA,1,0,0,1,NA,NA,Philosophy,SPRINGER,2018-09-26 +philosophia-international journal of philosophy,2244-1875,2244-1883,NA,1,0,0,0,NA,NA,Philosophy,PHILIPPINE NATL PHILOSOPHICAL RES SOC,NA +philosophia africana,1539-8250,1944-7914,NA,1,0,0,0,NA,NA,Philosophy,PENN STATE UNIV PRESS,NA +philosophia mathematica,0031-8019,1744-6406,NA,1,0,1,0,History & Philosophy Of Science,NA,Philosophy,OXFORD UNIV PRESS INC,NA +philosophia mathematica,0031-8019,1744-6406,NA,1,0,1,0,History & Philosophy Of Science,NA,Philosophy,OXFORD UNIV PRESS INC,NA +philosophical explorations,1386-9795,1741-5918,PhilExpl,1,0,0,1,NA,NA,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-06-09 +philosophical forum,0031-806X,1467-9191,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +philosophical investigations,0190-0536,1467-9205,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +philosophical issues,1533-6077,1758-2237,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +philosophical magazine,1478-6435,1478-6443,philosmag,0,0,1,1,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering | Physics, Applied | Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,2016-08-09 +philosophical magazine letters,0950-0839,1362-3036,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering | Physics, Applied | Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,NA +philosophical papers,0556-8641,1996-8523,NA,1,0,0,0,NA,NA,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +philosophical perspectives,1520-8583,1758-2245,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +philosophical psychology,0951-5089,1465-394X,JournalPHP,0,1,0,1,NA,"Ethics | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-10-19 +philosophical quarterly,0031-8094,1467-9213,NA,1,0,0,0,NA,NA,Philosophy,OXFORD UNIV PRESS,NA +philosophical review,0031-8108,1558-1470,NA,1,0,0,0,NA,NA,Philosophy,DUKE UNIV PRESS,NA +philosophical studies,0031-8116,1573-0883,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +philosophical transactions of the royal society a-mathematical physical and engineering sciences,1364-503X,1471-2962,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,ROYAL SOC,NA +philosophical transactions of the royal society b-biological sciences,0962-8436,1471-2970,NA,0,0,1,0,Biology,NA,NA,ROYAL SOC,NA +philosophische rundschau,0031-8159,1868-7261,NA,1,0,0,0,NA,NA,Philosophy,J C B MOHR,NA +philosophisches jahrbuch,0031-8183,0031-8183,NA,1,0,0,0,NA,NA,Philosophy,VERLAG KARL ALBER,NA +philosophy,0031-8191,1469-817X,NA,1,0,0,0,NA,NA,Philosophy,CAMBRIDGE UNIV PRESS,NA +philosophy & public affairs,0048-3915,1088-4963,NA,0,1,0,0,NA,Ethics | Political Science,NA,WILEY,NA +philosophy & social criticism,0191-4537,1461-734X,NA,1,0,0,0,NA,NA,Philosophy,SAGE PUBLICATIONS INC,NA +philosophy and literature,0190-0013,1086-329X,NA,1,0,0,0,NA,NA,Literary Theory & Criticism | Literature,JOHNS HOPKINS UNIV PRESS,NA +philosophy and phenomenological research,0031-8205,1933-1592,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +philosophy and rhetoric,0031-8213,1527-2079,NA,1,0,0,0,NA,NA,Philosophy | Literature,PENN STATE UNIV PRESS,NA +philosophy compass,1747-9991,1747-9991,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +philosophy east & west,0031-8221,1529-1898,NA,1,0,0,0,NA,NA,Philosophy | Asian Studies,UNIV HAWAII PRESS,NA +philosophy ethics and humanities in medicine,1747-5341,1747-5341,NA,1,1,1,0,History & Philosophy Of Science | Medical Ethics,History & Philosophy Of Science | Ethics,Philosophy | History & Philosophy Of Science,BMC,NA +philosophy ethics and humanities in medicine,1747-5341,1747-5341,NA,1,1,1,0,History & Philosophy Of Science | Medical Ethics,History & Philosophy Of Science | Ethics,Philosophy | History & Philosophy Of Science,BMC,NA +philosophy ethics and humanities in medicine,1747-5341,1747-5341,NA,1,1,1,0,History & Philosophy Of Science | Medical Ethics,History & Philosophy Of Science | Ethics,Philosophy | History & Philosophy Of Science,BMC,NA +philosophy of science,0031-8248,1539-767X,PhilSciJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2019-10-10 +philosophy of science,0031-8248,1539-767X,PhilSciJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2019-10-10 +philosophy of science,0031-8248,1539-767X,PhilSciJournal,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,UNIV CHICAGO PRESS,2019-10-10 +philosophy of the social sciences,0048-3931,1552-7441,NA,1,1,0,0,NA,Ethics,Philosophy,SAGE PUBLICATIONS INC,NA +philosophy of the social sciences,0048-3931,1552-7441,NA,1,1,0,0,NA,Ethics,Philosophy,SAGE PUBLICATIONS INC,NA +philosophy today,0031-8256,2329-8596,philosophy2day_,1,0,0,1,NA,NA,Philosophy,PHILOSOPHY TODAY DEPAUL UNIV,2017-08-15 +phlebology,0268-3555,1758-1125,zygon,0,0,1,1,Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS INC,2011-04-19 +phoenix-the journal of the classical association of canada,0031-8299,1929-4883,PhoenixClassics,1,0,0,1,NA,NA,Classics,CLASSICAL ASSOC CANADA,2015-02-18 +phonetica,0031-8388,1423-0321,NA,1,1,1,0,Acoustics | Audiology & Speech-Language Pathology,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +phonetica,0031-8388,1423-0321,NA,1,1,1,0,Acoustics | Audiology & Speech-Language Pathology,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +phonetica,0031-8388,1423-0321,NA,1,1,1,0,Acoustics | Audiology & Speech-Language Pathology,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +phonology,0952-6757,1469-8188,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +phonology,0952-6757,1469-8188,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +phosphorus sulfur and silicon and the related elements,1042-6507,1563-5325,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,TAYLOR & FRANCIS LTD,NA +photoacoustics,2213-5979,2213-5979,NA,0,0,1,0,"Engineering, Biomedical | Instruments & Instrumentation | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER GMBH,NA +photobiomodulation photomedicine and laser surgery,NA,2578-5478,NA,0,0,1,0,Surgery,NA,NA,"MARY ANN LIEBERT, INC",NA +photochemical & photobiological sciences,1474-905X,1474-9092,NA,0,0,1,0,"Biochemistry & Molecular Biology | Biophysics | Chemistry, Physical",NA,NA,SPRINGERNATURE,NA +photochemistry and photobiology,0031-8655,1751-1097,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,WILEY,NA +photodermatology photoimmunology & photomedicine,0905-4383,1600-0781,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +photodiagnosis and photodynamic therapy,1572-1000,1873-1597,NA,0,0,1,0,Oncology,NA,NA,ELSEVIER,NA +photogrammetric engineering and remote sensing,0099-1112,2374-8079,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary | Remote Sensing | Imaging Science & Photographic Technology",NA,NA,AMER SOC PHOTOGRAMMETRY,NA +photogrammetric record,0031-868X,1477-9730,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary | Remote Sensing | Imaging Science & Photographic Technology",NA,NA,WILEY,NA +photography and culture,1751-4517,1751-4525,NA,1,0,0,0,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +photonic network communications,1387-974X,1572-8188,NA,0,0,1,0,"Computer Science, Information Systems | Optics | Telecommunications",NA,NA,SPRINGER,NA +photonic sensors,1674-9251,2190-7439,NA,0,0,1,0,Instruments & Instrumentation | Optics,NA,NA,SPRINGER,NA +photonics,2304-6732,2304-6732,Photonics_MDPI,0,0,1,1,Optics,NA,NA,MDPI,2014-10-31 +photonics and nanostructures-fundamentals and applications,1569-4410,1569-4429,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Optics | Physics, Applied",NA,NA,ELSEVIER,NA +photonics research,2327-9125,2327-9125,NA,0,0,1,0,Optics,NA,NA,CHINESE LASER PRESS,NA +photosynthesis research,0166-8595,1573-5079,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +photosynthetica,0300-3604,1573-9058,NA,0,0,1,0,Plant Sciences,NA,NA,"ACAD SCIENCES CZECH REPUBLIC, INST EXPERIMENTAL BOTANY",NA +phronesis-a journal for ancient philosophy,0031-8868,1568-5284,Phronesisjourn2,1,0,0,1,NA,NA,Philosophy,BRILL,2020-11-27 +phycologia,0031-8884,2330-2968,NA,0,0,1,0,Plant Sciences | Marine & Freshwater Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +phycological research,1322-0829,1440-1835,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,WILEY,NA +phyllomedusa,1519-1397,2316-9079,NA,0,0,1,0,Zoology,NA,NA,"UNIV SAO PAULO, ESALQ",NA +physica a-statistical mechanics and its applications,0378-4371,1873-2119,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,ELSEVIER,NA +physica b-condensed matter,0921-4526,1873-2135,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,ELSEVIER,NA +physica c-superconductivity and its applications,0921-4534,1873-2143,NA,0,0,1,0,"Physics, Applied | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +physica d-nonlinear phenomena,0167-2789,1872-8022,NA,0,0,1,0,"Mathematics, Applied | Physics, Fluids & Plasmas | Physics, Multidisciplinary | Physics, Mathematical",NA,NA,ELSEVIER,NA +physica e-low-dimensional systems & nanostructures,1386-9477,1873-1759,NA,0,0,1,0,"Nanoscience & Nanotechnology | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +physica medica-european journal of medical physics,1120-1797,1724-191X,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCI LTD,NA +physica scripta,0031-8949,1402-4896,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +physica status solidi-rapid research letters,1862-6254,1862-6270,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,WILEY-V C H VERLAG GMBH,NA +physica status solidi a-applications and materials science,1862-6300,1862-6319,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,WILEY-V C H VERLAG GMBH,NA +physica status solidi b-basic solid state physics,0370-1972,1521-3951,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,WILEY-V C H VERLAG GMBH,NA +physical & occupational therapy in pediatrics,0194-2638,1541-3144,NA,0,1,1,0,Pediatrics | Rehabilitation,Rehabilitation,NA,TAYLOR & FRANCIS INC,NA +physical & occupational therapy in pediatrics,0194-2638,1541-3144,NA,0,1,1,0,Pediatrics | Rehabilitation,Rehabilitation,NA,TAYLOR & FRANCIS INC,NA +physical and engineering sciences in medicine,2662-4729,2662-4737,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging | Engineering, Biomedical",NA,NA,SPRINGER,NA +physical biology,1478-3967,1478-3975,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,IOP PUBLISHING LTD,NA +physical chemistry chemical physics,1463-9076,1463-9084,PCCP,0,0,1,1,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,ROYAL SOC CHEMISTRY,2009-03-10 +physical communication,1874-4907,1874-4907,NA,0,0,1,0,"Engineering, Electrical & Electronic | Telecommunications",NA,NA,ELSEVIER,NA +physical education and sport pedagogy,1740-8989,1742-5786,sport_pedagogy,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2019-04-30 +physical geography,0272-3646,1930-0557,NA,0,0,1,0,"Environmental Sciences | Geography, Physical | Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences",NA,NA,TAYLOR & FRANCIS LTD,NA +physical medicine and rehabilitation clinics of north america,1047-9651,1558-1381,NA,0,0,1,0,Rehabilitation,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +physical mesomechanics,1029-9599,1990-5424,NA,0,0,1,0,"Mechanics | Materials Science, Characterization, Testing",NA,NA,SPRINGER,NA +physical review a,2469-9926,2469-9934,PhysRevA,0,0,1,1,"Optics | Physics, Atomic, Molecular & Chemical",NA,NA,AMER PHYSICAL SOC,2015-12-29 +physical review accelerators and beams,2469-9888,2469-9888,PhysRevAB,0,0,1,1,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,AMER PHYSICAL SOC,2016-04-26 +physical review applied,2331-7019,2331-7019,PhysRevApplied,0,0,1,1,"Physics, Applied",NA,NA,AMER PHYSICAL SOC,2015-12-29 +physical review b,2469-9950,2469-9969,PhysRevB,0,0,1,1,"Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,AMER PHYSICAL SOC,2015-12-29 +physical review c,2469-9985,2469-9993,PhysRevC,0,0,1,1,"Physics, Nuclear",NA,NA,AMER PHYSICAL SOC,2015-12-29 +physical review d,2470-0010,2470-0029,PhysRevD,0,0,1,1,"Astronomy & Astrophysics | Physics, Particles & Fields",NA,NA,AMER PHYSICAL SOC,2015-12-29 +physical review e,2470-0045,2470-0053,PhysRevE,0,0,1,1,"Physics, Fluids & Plasmas | Physics, Mathematical",NA,NA,AMER PHYSICAL SOC,2015-12-29 +physical review fluids,2469-990X,2469-990X,PhysRevFluids,0,0,1,1,"Physics, Fluids & Plasmas",NA,NA,AMER PHYSICAL SOC,2015-12-29 +physical review letters,0031-9007,1079-7114,PhysRevLett,0,0,1,1,"Physics, Multidisciplinary",NA,NA,AMER PHYSICAL SOC,2015-02-15 +physical review materials,2475-9953,2475-9953,PhysRevMater,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,AMER PHYSICAL SOC,2017-01-27 +physical review physics education research,2469-9896,2469-9896,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,AMER PHYSICAL SOC,NA +physical review physics education research,2469-9896,2469-9896,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,AMER PHYSICAL SOC,NA +physical review x,2160-3308,2160-3308,PhysRevX,0,0,1,1,"Physics, Multidisciplinary",NA,NA,AMER PHYSICAL SOC,2015-12-29 +physical therapy & rehabilitation journal,0031-9023,1538-6724,PTJournal,0,0,1,1,Orthopedics | Rehabilitation,NA,NA,OXFORD UNIV PRESS INC,2009-04-06 +physical therapy in sport,1466-853X,1466-853X,NA,0,0,1,0,Rehabilitation | Sport Sciences,NA,NA,CHURCHILL LIVINGSTONE,NA +physician and sportsmedicine,0091-3847,2326-3660,PhysSportsMed,0,0,1,1,Primary Health Care | Orthopedics | Sport Sciences,NA,NA,TAYLOR & FRANCIS LTD,2009-12-24 +physicochemical problems of mineral processing,1643-1049,2084-4735,ProblemsMineral,0,0,1,1,"Chemistry, Physical | Mining & Mineral Processing",NA,NA,OFICYNA WYDAWNICZA POLITECHNIKI WROCLAWSKIEJ,2020-02-26 +physics-uspekhi,1063-7869,1468-4780,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,TURPION LTD,NA +physics and chemistry of glasses-european journal of glass science and technology part b,1753-3562,1750-6689,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Ceramics",NA,NA,SOC GLASS TECHNOLOGY,NA +physics and chemistry of liquids,0031-9104,1029-0451,NA,0,0,1,0,"Chemistry, Physical | Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,NA +physics and chemistry of minerals,0342-1791,1432-2021,NA,0,0,1,0,"Materials Science, Multidisciplinary | Mineralogy",NA,NA,SPRINGER,NA +physics and chemistry of the earth,1474-7065,1873-5193,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Water Resources",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +physics in medicine and biology,0031-9155,1361-6560,NA,0,0,1,0,"Engineering, Biomedical | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,IOP PUBLISHING LTD,NA +physics in perspective,1422-6944,1422-6960,NA,0,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,NA,SPRINGER BASEL AG,NA +physics in perspective,1422-6944,1422-6960,NA,0,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,NA,SPRINGER BASEL AG,NA +physics letters a,0375-9601,1873-2429,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,ELSEVIER,NA +physics letters b,0370-2693,1873-2445,NA,0,0,1,0,"Astronomy & Astrophysics | Physics, Nuclear | Physics, Particles & Fields",NA,NA,ELSEVIER,NA +physics of atomic nuclei,1063-7788,1562-692X,NA,0,0,1,0,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,PLEIADES PUBLISHING INC,NA +physics of fluids,1070-6631,1089-7666,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,AIP PUBLISHING,NA +physics of life reviews,1571-0645,1873-1457,NA,0,0,1,0,Biology | Biophysics,NA,NA,ELSEVIER,NA +physics of metals and metallography,0031-918X,1555-6190,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +physics of particles and nuclei,1063-7796,1531-8559,NA,0,0,1,0,"Physics, Particles & Fields",NA,NA,PLEIADES PUBLISHING INC,NA +physics of plasmas,1070-664X,1089-7674,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,AIP PUBLISHING,NA +physics of the dark universe,2212-6864,2212-6864,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,ELSEVIER,NA +physics of the earth and planetary interiors,0031-9201,1872-7395,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,ELSEVIER,NA +physics of the solid state,1063-7834,1090-6460,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,PLEIADES PUBLISHING INC,NA +physics of wave phenomena,1541-308X,1934-807X,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,PLEIADES PUBLISHING INC,NA +physics reports-review section of physics letters,0370-1573,1873-6270,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,ELSEVIER,NA +physics teacher,0031-921X,1943-4928,TptJournal,0,0,1,1,"Education, Scientific Disciplines | Physics, Multidisciplinary",NA,NA,AMER ASSN PHYSICS TEACHERS,2016-11-29 +physics today,0031-9228,1945-0699,PhysicsToday,0,0,1,1,"Physics, Multidisciplinary",NA,NA,AMER INST PHYSICS,2009-02-11 +physics world,0953-8585,0953-8585,PhysicsWorld,0,0,1,1,"Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,2009-04-03 +physikalische medizin rehabilitationsmedizin kurortmedizin,0940-6689,1439-085X,NA,0,0,1,0,Rehabilitation | Sport Sciences,NA,NA,GEORG THIEME VERLAG KG,NA +physiologia plantarum,0031-9317,1399-3054,PPLplantarum,0,0,1,1,Plant Sciences,NA,NA,WILEY,2018-01-22 +physiological and biochemical zoology,1522-2152,1537-5293,NA,0,0,1,0,Physiology | Zoology,NA,NA,UNIV CHICAGO PRESS,NA +physiological and molecular plant pathology,0885-5765,1096-1178,NA,0,0,1,0,Plant Sciences,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +physiological entomology,0307-6962,1365-3032,Physiol_Ent,0,0,1,1,Entomology,NA,NA,WILEY,2015-03-30 +physiological genomics,1094-8341,1531-2267,PhysiologicalG,0,0,1,1,Cell Biology | Genetics & Heredity | Physiology,NA,NA,AMER PHYSIOLOGICAL SOC,2018-06-21 +physiological measurement,0967-3334,1361-6579,NA,0,0,1,0,"Biophysics | Engineering, Biomedical | Physiology",NA,NA,IOP PUBLISHING LTD,NA +physiological research,0862-8408,1802-9973,NA,0,0,1,0,Physiology,NA,NA,"ACAD SCIENCES CZECH REPUBLIC, INST PHYSIOLOGY",NA +physiological reviews,0031-9333,1522-1210,physiology,0,0,1,1,Physiology,NA,NA,AMER PHYSIOLOGICAL SOC,NA +physiology,1548-9213,1548-9221,physiol_journal,0,0,1,1,Physiology,NA,NA,AMER PHYSIOLOGICAL SOC,2021-07-20 +physiology & behavior,0031-9384,1873-507X,NA,0,1,1,0,Behavioral Sciences,"Psychology, Biological",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +physiology & behavior,0031-9384,1873-507X,NA,0,1,1,0,Behavioral Sciences,"Psychology, Biological",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +physiology and molecular biology of plants,0971-5894,0974-0430,journalPMBP,0,0,1,1,Plant Sciences,NA,NA,SPRINGER,2020-06-30 +physiology international,2498-602X,2498-602X,NA,0,0,1,0,Physiology,NA,NA,AKADEMIAI KIADO ZRT,NA +physiotherapy,0031-9406,1873-1465,NA,0,0,1,0,Rehabilitation,NA,NA,ELSEVIER SCI LTD,NA +physiotherapy canada,0300-0508,1708-8313,NA,0,0,1,0,Rehabilitation,NA,NA,UNIV TORONTO PRESS INC,NA +physiotherapy theory and practice,0959-3985,1532-5040,NA,0,0,1,0,Rehabilitation,NA,NA,TAYLOR & FRANCIS INC,NA +phytobiomes journal,NA,2471-2906,PhytobiomesJ,0,0,1,1,Plant Sciences | Microbiology,NA,NA,AMER PHYTOPATHOLOGICAL SOC,2016-06-06 +phytochemical analysis,0958-0344,1099-1565,NA,0,0,1,0,"Biochemical Research Methods | Plant Sciences | Chemistry, Analytical",NA,NA,WILEY,NA +phytochemistry,0031-9422,1873-3700,NA,0,0,1,0,Biochemistry & Molecular Biology | Plant Sciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +phytochemistry letters,1874-3900,1876-7486,NA,0,0,1,0,"Plant Sciences | Chemistry, Medicinal",NA,NA,ELSEVIER,NA +phytochemistry reviews,1568-7767,1572-980X,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +phytocoenologia,0340-269X,NA,NA,0,0,1,0,Plant Sciences | Ecology,NA,NA,GEBRUDER BORNTRAEGER,NA +phytokeys,1314-2011,1314-2003,PhytoKeys,0,0,1,1,Plant Sciences,NA,NA,PENSOFT PUBLISHERS,2010-10-23 +phytomedicine,0944-7113,1618-095X,NA,0,0,1,0,"Plant Sciences | Chemistry, Medicinal | Integrative & Complementary Medicine | Pharmacology & Pharmacy",NA,NA,ELSEVIER GMBH,NA +phyton-annales rei botanicae,0079-2047,NA,NA,0,0,1,0,Plant Sciences,NA,NA,FERDINAND BERGER SOEHNE,NA +phyton-international journal of experimental botany,0031-9457,1851-5657,NA,0,0,1,0,Plant Sciences,NA,NA,TECH SCIENCE PRESS,NA +phytoparasitica,0334-2123,1876-7184,NA,0,0,1,0,Agronomy | Plant Sciences | Entomology,NA,NA,SPRINGER,NA +phytopathologia mediterranea,0031-9465,1593-2095,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,MEDITERRANEAN PHYTOPATHOLOGICAL UNION,NA +phytopathology,0031-949X,1943-7684,PhytopathologyJ,0,0,1,1,Plant Sciences,NA,NA,AMER PHYTOPATHOLOGICAL SOC,2016-06-08 +phytoprotection,0031-9511,1710-1603,NA,0,0,1,0,Plant Sciences,NA,NA,QUEBEC SOC PROTECT PLANTS,NA +phytotaxa,1179-3155,1179-3163,Phytotaxa,0,0,1,1,Plant Sciences,NA,NA,MAGNOLIA PRESS,2010-05-03 +phytotherapy research,0951-418X,1099-1573,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,WILEY,NA +pigment & resin technology,0369-9420,1758-6941,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical | Materials Science, Coatings & Films",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +pigment cell & melanoma research,1755-1471,1755-148X,PCMR_Wiley,0,0,1,1,Oncology | Cell Biology | Dermatology,NA,NA,WILEY,2020-06-29 +pituitary,1386-341X,1573-7403,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER,NA +placenta,0143-4004,1532-3102,NA,0,0,1,0,Developmental Biology | Obstetrics & Gynecology | Reproductive Biology,NA,NA,W B SAUNDERS CO LTD,NA +plainsong & medieval music,0961-1371,1474-0087,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies | Music,CAMBRIDGE UNIV PRESS,NA +planetary and space science,0032-0633,1873-5088,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +plankton & benthos research,1880-8247,1882-627X,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,PLANKTON SOC JAPAN,NA +planning perspectives,0266-5433,1466-4518,planningpersp,1,1,0,1,NA,History Of Social Sciences,History | Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-12-22 +planning perspectives,0266-5433,1466-4518,planningpersp,1,1,0,1,NA,History Of Social Sciences,History | Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-12-22 +planning theory,1473-0952,1741-3052,NA,0,1,0,0,NA,Regional & Urban Planning,NA,SAGE PUBLICATIONS INC,NA +planning theory & practice,1464-9357,1470-000X,Planning_theory,0,1,0,1,NA,Regional & Urban Planning | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2010-02-12 +plant and cell physiology,0032-0781,1471-9053,PCP_EIC,0,0,1,1,Plant Sciences | Cell Biology,NA,NA,OXFORD UNIV PRESS,2016-12-02 +plant and soil,0032-079X,1573-5036,NA,0,0,1,0,Agronomy | Plant Sciences | Soil Science,NA,NA,SPRINGER,NA +plant biology,1435-8603,1438-8677,NA,0,0,1,0,Plant Sciences,NA,NA,WILEY,NA +plant biosystems,1126-3504,1724-5575,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +plant biotechnology,1342-4580,NA,NA,0,0,1,0,Biotechnology & Applied Microbiology | Plant Sciences,NA,NA,JAPANESE SOC PLANT CELL & MOLECULAR BIOLOGY,NA +plant biotechnology journal,1467-7644,1467-7652,PlantBiotechJ,0,0,1,1,Biotechnology & Applied Microbiology | Plant Sciences,NA,NA,WILEY,2019-05-31 +plant biotechnology reports,1863-5466,1863-5474,NA,0,0,1,0,Biotechnology & Applied Microbiology | Plant Sciences,NA,NA,SPRINGER,NA +plant breeding,0179-9541,1439-0523,NA,0,0,1,0,Agronomy | Biotechnology & Applied Microbiology | Plant Sciences,NA,NA,WILEY,NA +plant cell,1040-4651,1532-298X,ThePlantCell,0,0,1,1,Biochemistry & Molecular Biology | Plant Sciences | Cell Biology,NA,NA,OXFORD UNIV PRESS INC,2011-09-08 +plant cell and environment,0140-7791,1365-3040,NA,0,0,1,0,Plant Sciences,NA,NA,WILEY,NA +plant cell reports,0721-7714,1432-203X,PlantCellRep,0,0,1,1,Plant Sciences,NA,NA,SPRINGER,2017-03-02 +plant cell tissue and organ culture,0167-6857,1573-5044,PCTOCjournal,0,0,1,1,Biotechnology & Applied Microbiology | Plant Sciences,NA,NA,SPRINGER,2021-07-14 +plant direct,2475-4455,2475-4455,PlantDirectJ,0,0,1,1,Plant Sciences,NA,NA,JOHN WILEY & SONS LTD,2017-01-08 +plant disease,0191-2917,1943-7692,PlantDiseaseJ,0,0,1,1,Plant Sciences,NA,NA,AMER PHYTOPATHOLOGICAL SOC,2016-06-08 +plant diversity,2096-2703,2468-2659,NA,0,0,1,0,Plant Sciences,NA,NA,KEAI PUBLISHING LTD,NA +plant ecology,1385-0237,1573-5052,NA,0,0,1,0,Plant Sciences | Ecology | Forestry,NA,NA,SPRINGER,NA +plant ecology & diversity,1755-0874,1755-1668,NA,0,0,1,0,Plant Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +plant ecology and evolution,2032-3913,2032-3921,plecevo,0,0,1,1,Plant Sciences,NA,NA,SOC ROYAL BOTAN BELGIQUE,2019-06-27 +plant foods for human nutrition,0921-9668,1573-9104,NA,0,0,1,0,"Plant Sciences | Chemistry, Applied | Food Science & Technology | Nutrition & Dietetics",NA,NA,SPRINGER,NA +plant genetic resources-characterization and utilization,1479-2621,1479-263X,NA,0,0,1,0,Plant Sciences,NA,NA,CAMBRIDGE UNIV PRESS,NA +plant genome,1940-3372,1940-3372,plantgenome,0,0,1,1,Plant Sciences | Genetics & Heredity,NA,NA,WILEY,2015-01-22 +plant growth regulation,0167-6903,1573-5087,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +plant journal,0960-7412,1365-313X,ThePlantJournal,0,0,1,1,Plant Sciences,NA,NA,WILEY,2010-08-10 +plant methods,1746-4811,1746-4811,PlantMethods,0,0,1,1,Biochemical Research Methods | Plant Sciences,NA,NA,BMC,2011-05-06 +plant molecular biology,0167-4412,1573-5028,NA,0,0,1,0,Biochemistry & Molecular Biology | Plant Sciences,NA,NA,SPRINGER,NA +plant molecular biology reporter,0735-9640,1572-9818,NA,0,0,1,0,Biochemical Research Methods | Plant Sciences,NA,NA,SPRINGER,NA +plant pathology,0032-0862,1365-3059,BSPPjournals,0,0,1,1,Agronomy | Plant Sciences,NA,NA,WILEY,2015-05-27 +plant pathology journal,1598-2254,2093-9280,NA,0,0,1,0,Plant Sciences,NA,NA,KOREAN SOC PLANT PATHOLOGY,NA +plant phenomics,2643-6515,2643-6515,PPhenomics,0,0,1,1,Plant Sciences | Agronomy | Remote Sensing,NA,NA,AMER ASSOC ADVANCEMENT SCIENCE,2018-09-11 +plant physiology,0032-0889,1532-2548,PlantPhys,0,0,1,1,Plant Sciences,NA,NA,OXFORD UNIV PRESS INC,2011-09-01 +plant physiology and biochemistry,0981-9428,1873-2690,NA,0,0,1,0,Plant Sciences,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +plant production science,1343-943X,1349-1008,NA,0,0,1,0,Agronomy,NA,NA,TAYLOR & FRANCIS LTD,NA +plant protection science,1212-2580,1805-9341,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +plant reproduction,2194-7953,2194-7961,NA,0,0,1,0,Plant Sciences | Reproductive Biology,NA,NA,SPRINGER,NA +plant science,0168-9452,1873-2259,NA,0,0,1,0,Biochemistry & Molecular Biology | Plant Sciences,NA,NA,ELSEVIER IRELAND LTD,NA +plant signaling & behavior,1559-2316,1559-2324,NA,0,0,1,0,Biochemistry & Molecular Biology | Plant Sciences,NA,NA,TAYLOR & FRANCIS INC,NA +plant soil and environment,1214-1178,1805-9368,NA,0,0,1,0,Agronomy,NA,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +plant species biology,0913-557X,1442-1984,PlantSpeciesBio,0,0,1,1,Plant Sciences | Ecology,NA,NA,WILEY,2019-05-22 +plant systematics and evolution,0378-2697,1615-6110,NA,0,0,1,0,Plant Sciences | Evolutionary Biology,NA,NA,SPRINGER WIEN,NA +planta,0032-0935,1432-2048,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +planta medica,0032-0943,1439-0221,NA,0,0,1,0,"Plant Sciences | Chemistry, Medicinal | Integrative & Complementary Medicine | Pharmacology & Pharmacy",NA,NA,GEORG THIEME VERLAG KG,NA +plants-basel,2223-7747,2223-7747,Plants_MDPI,0,0,1,1,Plant Sciences,NA,NA,MDPI,2018-01-26 +plasma chemistry and plasma processing,0272-4324,1572-8986,NA,0,0,1,0,"Engineering, Chemical | Physics, Applied | Physics, Fluids & Plasmas",NA,NA,SPRINGER,NA +plasma physics and controlled fusion,0741-3335,1361-6587,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,IOP PUBLISHING LTD,NA +plasma physics reports,1063-780X,1562-6938,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,PLEIADES PUBLISHING INC,NA +plasma processes and polymers,1612-8850,1612-8869,NA,0,0,1,0,"Physics, Applied | Physics, Fluids & Plasmas | Physics, Condensed Matter | Polymer Science",NA,NA,WILEY-V C H VERLAG GMBH,NA +plasma science & technology,1009-0630,2058-6272,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,IOP PUBLISHING LTD,NA +plasma sources science & technology,0963-0252,1361-6595,NA,0,0,1,0,"Physics, Fluids & Plasmas",NA,NA,IOP PUBLISHING LTD,NA +plasmid,0147-619X,1095-9890,NA,0,0,1,0,Genetics & Heredity | Microbiology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +plasmonics,1557-1955,1557-1963,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +plastic and reconstructive surgery,0032-1052,1529-4242,prsjournal,0,0,1,1,Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2009-04-20 +plastic surgery,2292-5503,2292-5511,NA,0,0,1,0,Surgery,NA,NA,SAGE PUBLICATIONS INC,NA +plastics rubber and composites,1465-8011,1743-2898,NA,0,0,1,0,"Materials Science, Composites | Polymer Science",NA,NA,TAYLOR & FRANCIS LTD,NA +platelets,0953-7104,1369-1635,plateletjournal,0,0,1,1,Cell Biology | Hematology,NA,NA,TAYLOR & FRANCIS INC,2015-12-10 +plos biology,1544-9173,1545-7885,PLOSBiology,0,0,1,1,Biochemistry & Molecular Biology | Biology,NA,NA,PUBLIC LIBRARY SCIENCE,2009-12-11 +plos computational biology,1553-734X,1553-7358,PLOSCompBiol,0,0,1,1,Biochemical Research Methods | Mathematical & Computational Biology,NA,NA,PUBLIC LIBRARY SCIENCE,2010-04-23 +plos genetics,1553-7404,1553-7404,PLOSGenetics,0,0,1,1,Genetics & Heredity,NA,NA,PUBLIC LIBRARY SCIENCE,2011-10-10 +plos medicine,1549-1277,1549-1676,PLOSMedicine,0,0,1,1,"Medicine, General & Internal",NA,NA,PUBLIC LIBRARY SCIENCE,2009-11-10 +plos neglected tropical diseases,1935-2735,1935-2735,PLOSNTDs,0,0,1,1,Parasitology | Tropical Medicine,NA,NA,PUBLIC LIBRARY SCIENCE,2012-02-25 +plos one,1932-6203,1932-6203,PLOSONE,0,0,1,1,Multidisciplinary Sciences,NA,NA,PUBLIC LIBRARY SCIENCE,2009-03-30 +plos pathogens,1553-7366,1553-7374,PLOSPathogens,0,0,1,1,Microbiology | Parasitology | Virology,NA,NA,PUBLIC LIBRARY SCIENCE,2010-08-05 +ploughshares,0048-4474,2162-0903,pshares,1,0,0,1,NA,NA,Literary Reviews,PLOUGHSHARES INC,2009-04-14 +pluralist,1930-7365,1944-6489,NA,1,0,0,0,NA,NA,Philosophy,UNIV ILLINOIS PRESS,NA +pm&r,1934-1482,1934-1563,PMRJournal,0,0,1,1,Rehabilitation | Sport Sciences,NA,NA,WILEY,2014-05-01 +pmla-publications of the modern language association of america,0030-8129,1938-1530,NA,1,0,0,0,NA,NA,Literature,CAMBRIDGE UNIV PRESS,NA +poe studies-history theory interpretation,1947-4644,1754-6095,NA,1,0,0,0,NA,NA,"Literature, American",JOHNS HOPKINS UNIV PRESS,NA +poetica-zeitschrift fur sprach-und literaturwissenschaft,0303-4178,2589-0530,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,BRILL,NA +poetics,0304-422X,1872-7514,poetics_journal,1,1,0,1,NA,Sociology,Literature,ELSEVIER,2020-07-09 +poetics,0304-422X,1872-7514,poetics_journal,1,1,0,1,NA,Sociology,Literature,ELSEVIER,2020-07-09 +poetics today,0333-5372,1527-5507,NA,1,0,0,0,NA,NA,Literature,DUKE UNIV PRESS,NA +poetry,0032-2032,2330-0795,poetrymagazine,1,0,0,1,NA,NA,Poetry,POETRY,2008-11-20 +poetry review,0032-2156,NA,NA,1,0,0,0,NA,NA,Poetry,POETRY SOC INC,NA +poetry wales,0032-2202,NA,poetrywales,1,0,0,1,NA,NA,Poetry,"SEREN BOOKS, POETRY WALES",2011-04-08 +polar-political and legal anthropology review,1081-6976,1555-2934,Polar_Journal,0,1,0,1,NA,Anthropology,NA,"WILEY PERIODICALS, INC",2019-03-19 +polar biology,0722-4060,1432-2056,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,SPRINGER,NA +polar record,0032-2474,1475-3057,PolarRecord,0,0,1,1,Ecology | Environmental Sciences,NA,NA,CAMBRIDGE UNIV PRESS,2017-06-21 +polar research,0800-0395,1751-8369,PolarResearch,0,0,1,1,"Ecology | Geosciences, Multidisciplinary | Oceanography",NA,NA,OPEN ACADEMIA AB,2011-04-27 +polar science,1873-9652,1876-4428,NA,0,0,1,0,"Ecology | Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +police quarterly,1098-6111,1552-745X,NA,0,1,0,0,NA,Criminology & Penology,NA,SAGE PUBLICATIONS INC,NA +policing-a journal of policy and practice,1752-4512,1752-4520,NA,0,1,0,0,NA,Criminology & Penology,NA,OXFORD UNIV PRESS,NA +policing-an international journal of police strategies & management,1363-951X,1758-695X,PolicingJournal,0,1,0,1,NA,Criminology & Penology,NA,EMERALD GROUP PUBLISHING LTD,2021-07-02 +policing & society,1043-9463,1477-2728,NA,0,1,0,0,NA,Criminology & Penology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +policy and internet,1944-2866,1944-2866,policyinternet,0,1,0,1,NA,Communication | Political Science,NA,WILEY,2013-11-01 +policy and politics,0305-5736,1470-8442,NA,0,1,0,0,NA,Political Science | Public Administration,NA,POLICY PRESS,NA +policy and society,1449-4035,1839-3373,NA,0,1,0,0,NA,Political Science | Public Administration,NA,TAYLOR & FRANCIS LTD,NA +policy sciences,0032-2687,1573-0891,NA,0,1,0,0,NA,"Public Administration | Social Sciences, Interdisciplinary",NA,SPRINGER,NA +policy studies,0144-2872,1470-1006,PolicyStudiesTF,0,1,0,1,NA,Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-05-28 +policy studies journal,0190-292X,1541-0072,psj_editor,0,1,0,1,NA,Political Science | Public Administration,NA,WILEY,2015-09-16 +polimeros-ciencia e tecnologia,0104-1428,1678-5169,polimerosCT,0,0,1,1,Polymer Science,NA,NA,ASSOC BRASIL POLIMEROS,2016-02-17 +polimery,0032-2725,0032-2725,NA,0,0,1,0,Polymer Science,NA,NA,INDUSTRIAL CHEMISTRY RESEARCH INST,NA +polis,0142-257X,2051-2996,PolisJournal,1,0,0,1,NA,NA,Classics,BRILL,2021-01-13 +polish archives of internal medicine-polskie archiwum medycyny wewnetrznej,0032-3772,1897-9483,PolishArchives,0,0,1,1,"Medicine, General & Internal",NA,NA,MEDYCYNA PRAKTYCZNA SP K SP ZOO,2019-06-27 +polish journal of chemical technology,1509-8117,1899-4741,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical",NA,NA,SCIENDO,NA +polish journal of ecology,1505-2249,NA,NA,0,0,1,0,Ecology,NA,NA,POLISH ACAD SCIENCES INST ECOLOGY,NA +polish journal of environmental studies,1230-1485,2083-5906,NA,0,0,1,0,Environmental Sciences,NA,NA,HARD,NA +polish journal of food and nutrition sciences,1230-0322,2083-6007,NA,0,0,1,0,Food Science & Technology,NA,NA,INST ANIMAL REPRODUCTION & FOOD RESEARCH POLISH ACAD SCIENCES OLSZTYN,NA +polish journal of microbiology,1733-1331,2544-4646,NA,0,0,1,0,Microbiology,NA,NA,POLSKIE TOWARZYSTWO MIKROBIOLOGOW-POLISH SOCIETY OF MICROBIOLOGISTS,NA +polish journal of pathology,1233-9687,1233-9687,NA,0,0,1,0,Pathology,NA,NA,VESALIUS UNIV MEDICAL PUBL,NA +polish journal of veterinary sciences,1505-1773,2300-2557,NA,0,0,1,0,Veterinary Sciences,NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES, UNIV WARMIA & MAZURY OLSZTYN",NA +polish maritime research,1233-2585,2083-7429,NA,0,0,1,0,"Engineering, Marine",NA,NA,SCIENDO,NA +polish polar research,0138-0338,2081-8262,NA,0,0,1,0,"Ecology | Geosciences, Multidisciplinary",NA,NA,"POLSKA AKAD NAUK, POLISH ACAD SCIENCES",NA +polish sociological review,1231-1413,1231-1413,NA,0,1,0,0,NA,Sociology,NA,POLSKIE TOWARZYSTWO SOCJOLOGICZNE-POLISH SOCIOLOGICAL ASSOC,NA +politica y gobierno,1665-2037,NA,polgob,0,1,0,1,NA,Political Science,NA,CENTRO DE INVESTIGACION Y DOCENCIA ECONOMICAS,2014-07-22 +political analysis,1047-1987,1476-4989,polanalysis,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2010-09-04 +political behavior,0190-9320,1573-6687,polbehavior,0,1,0,1,NA,Political Science,NA,SPRINGER/PLENUM PUBLISHERS,2014-12-01 +political communication,1058-4609,1091-7675,polcommjournal,0,1,0,1,NA,Communication | Political Science,NA,TAYLOR & FRANCIS INC,2021-05-24 +political geography,0962-6298,1873-5096,pol_geog_jl,0,1,0,1,NA,Geography | Political Science,NA,ELSEVIER SCI LTD,2016-03-24 +political psychology,0162-895X,1467-9221,journal_pops,0,1,0,1,NA,"Political Science | Psychology, Social",NA,WILEY,2017-09-13 +political quarterly,0032-3179,1467-923X,po_qu,0,1,0,1,NA,Political Science,NA,WILEY,2012-04-10 +political research quarterly,1065-9129,1938-274X,prqjournal,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS INC,2016-09-13 +political science,0032-3187,2041-0611,NA,0,1,0,0,NA,Political Science,NA,TAYLOR & FRANCIS LTD,NA +political science quarterly,0032-3195,1538-165X,psquarterly,0,1,0,1,NA,Political Science,NA,WILEY,2013-04-08 +political science research and methods,2049-8470,2049-8489,psrmjournal,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2012-11-20 +political studies,0032-3217,1467-9248,polstudies,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS LTD,2015-01-20 +political studies review,1478-9299,1478-9302,polstudiesrev,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS LTD,2015-09-07 +political theory,0090-5917,1552-7476,politicaltheory,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS INC,2020-11-02 +politicka ekonomie,0032-3233,2336-8225,NA,0,1,0,0,NA,Economics | Political Science,NA,VYSOKA SKOLA EKONOMICKA,NA +politics,0263-3957,1467-9256,journalpolitics,0,1,0,1,NA,International Relations | Political Science,NA,SAGE PUBLICATIONS LTD,2012-02-08 +politics & gender,1743-923X,1743-9248,politicsgenderj,0,1,0,1,NA,Political Science | Women'S Studies,NA,CAMBRIDGE UNIV PRESS,2019-03-04 +politics & society,0032-3292,1552-7514,pasupdates,0,1,0,1,NA,Political Science | Social Issues | Sociology,NA,SAGE PUBLICATIONS INC,2011-03-10 +politics and governance,2183-2463,2183-2463,NA,0,1,0,0,NA,Political Science,NA,COGITATIO PRESS,NA +politics and religion,1755-0483,1755-0491,pandrjournal,1,1,0,1,NA,Political Science,Religion,CAMBRIDGE UNIV PRESS,2015-01-16 +politics and religion,1755-0483,1755-0491,pandrjournal,1,1,0,1,NA,Political Science,Religion,CAMBRIDGE UNIV PRESS,2015-01-16 +politics groups and identities,2156-5503,2156-5511,PGI_WPSA,0,1,0,1,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-07-16 +politics philosophy & economics,1470-594X,1741-3060,NA,0,1,0,0,NA,Ethics | Political Science,NA,SAGE PUBLICATIONS INC,NA +politics religion & ideology,2156-7689,2156-7697,NA,1,1,0,0,NA,History | Political Science,History | Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +politics religion & ideology,2156-7689,2156-7697,NA,1,1,0,0,NA,History | Political Science,History | Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +politikon,0258-9346,1470-1014,iapss_politikon,0,1,0,1,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +politische vierteljahresschrift,0032-3470,1862-2860,pvs_journal,0,1,0,1,NA,Political Science,NA,SPRINGER,2017-01-26 +politix,0295-2319,1953-8286,NA,0,1,0,0,NA,Political Science,NA,DE BOECK UNIV,NA +polity,0032-3497,1744-1684,polityalsberuf,0,1,0,1,NA,Political Science,NA,UNIV CHICAGO PRESS,2020-04-17 +polycyclic aromatic compounds,1040-6638,1563-5333,NA,0,0,1,0,"Chemistry, Organic",NA,NA,TAYLOR & FRANCIS LTD,NA +polyhedron,0277-5387,1873-3719,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Crystallography",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +polymer,0032-3861,1873-2291,NA,0,0,1,0,Polymer Science,NA,NA,ELSEVIER SCI LTD,NA +polymer-korea,0379-153X,2234-8077,NA,0,0,1,0,Polymer Science,NA,NA,POLYMER SOC KOREA,NA +polymer-plastics technology and materials,2574-0881,2574-089X,NA,0,0,1,0,Polymer Science,NA,NA,TAYLOR & FRANCIS INC,NA +polymer bulletin,0170-0839,1436-2449,NA,0,0,1,0,Polymer Science,NA,NA,SPRINGER,NA +polymer chemistry,1759-9954,1759-9962,PolymChem,0,0,1,1,Polymer Science,NA,NA,ROYAL SOC CHEMISTRY,2009-03-10 +polymer composites,0272-8397,1548-0569,NA,0,0,1,0,"Materials Science, Composites | Polymer Science",NA,NA,WILEY,NA +polymer degradation and stability,0141-3910,1873-2321,NA,0,0,1,0,Polymer Science,NA,NA,ELSEVIER SCI LTD,NA +polymer engineering and science,0032-3888,1548-2634,NA,0,0,1,0,"Engineering, Chemical | Polymer Science",NA,NA,WILEY,NA +polymer international,0959-8103,1097-0126,NA,0,0,1,0,Polymer Science,NA,NA,WILEY,NA +polymer journal,0032-3896,1349-0540,NA,0,0,1,0,Polymer Science,NA,NA,SPRINGERNATURE,NA +polymer reviews,1558-3724,1558-3716,NA,0,0,1,0,Polymer Science,NA,NA,TAYLOR & FRANCIS INC,NA +polymer science series a,0965-545X,1555-6107,NA,0,0,1,0,Polymer Science,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +polymer science series b,1560-0904,1555-6123,NA,0,0,1,0,Polymer Science,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +polymer science series c,1811-2382,1555-614X,NA,0,0,1,0,Polymer Science,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +polymer testing,0142-9418,1873-2348,NA,0,0,1,0,"Materials Science, Characterization, Testing | Polymer Science",NA,NA,ELSEVIER SCI LTD,NA +polymers,2073-4360,2073-4360,Polymers_MDPI,0,0,1,1,Polymer Science,NA,NA,MDPI,2015-09-10 +polymers & polymer composites,0967-3911,1478-2391,NA,0,0,1,0,"Materials Science, Characterization, Testing | Materials Science, Composites | Polymer Science",NA,NA,SAGE PUBLICATIONS LTD,NA +polymers for advanced technologies,1042-7147,1099-1581,NA,0,0,1,0,Polymer Science,NA,NA,WILEY,NA +pomegranate,1528-0268,1528-0268,NA,1,0,0,0,NA,NA,Religion,EQUINOX PUBLISHING LTD,NA +ponte,0032-423X,NA,NA,1,0,0,0,NA,NA,Literary Reviews,IL PONTE EDITORE,NA +popular entertainment studies,1837-9303,1837-9303,NA,1,0,0,0,NA,NA,Theater,UNIV NEWCASTLE,NA +popular music,0261-1430,1474-0095,PopularMusicJnl,1,0,0,1,NA,NA,Music,CAMBRIDGE UNIV PRESS,2010-03-23 +popular music and society,0300-7766,1740-1712,NA,1,0,0,0,NA,NA,Music,TAYLOR & FRANCIS LTD,NA +population,0032-4663,1957-7966,NA,0,1,0,0,NA,Demography,NA,INST NATL D ETUDES DEMOGRAPHIQUES,NA +population and development review,0098-7921,1728-4457,NA,0,1,0,0,NA,Demography | Sociology,NA,WILEY,NA +population and environment,0199-0039,1573-7810,NA,0,1,0,0,NA,Demography | Environmental Studies,NA,SPRINGER,NA +population ecology,1438-3896,1438-390X,PopulationEcol,0,0,1,1,Ecology,NA,NA,WILEY,2019-05-22 +population health management,1942-7891,1942-7905,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,"MARY ANN LIEBERT, INC",NA +population health metrics,1478-7954,1478-7954,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,BMC,NA +population research and policy review,0167-5923,1573-7829,NA,0,1,0,0,NA,Demography,NA,SPRINGER,NA +population space and place,1544-8444,1544-8452,NA,0,1,0,0,NA,Demography | Geography,NA,WILEY,NA +population studies-a journal of demography,0032-4728,1477-4747,NA,0,1,0,0,NA,Demography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +porcine health management,2055-5660,2055-5660,NA,0,0,1,0,Veterinary Sciences,NA,NA,BMC,NA +porta linguarum,1697-7467,2695-8244,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,UNIV GRANADA,NA +porta linguarum,1697-7467,2695-8244,NA,1,1,0,0,NA,Education & Educational Research | Linguistics,Language & Linguistics,UNIV GRANADA,NA +portal-libraries and the academy,1531-2542,1530-7131,PortalJournal,0,1,0,1,NA,Information Science & Library Science,NA,JOHNS HOPKINS UNIV PRESS,2017-12-14 +portugaliae mathematica,0032-5155,1662-2758,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +portuguese economic journal,1617-982X,1617-9838,PortEconJ,0,1,0,1,NA,Economics,NA,SPRINGER HEIDELBERG,2017-12-06 +portuguese studies,0267-5315,2222-4270,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",MODERN HUMANITIES RESEARCH ASSOCIATION,NA +positif,0048-4911,NA,RevuePositif,1,0,0,1,NA,NA,"Film, Radio, Television",POSITIF EDITIONS,2013-02-14 +positions-asia critique,1067-9847,1527-8271,NA,1,0,0,0,NA,NA,Asian Studies,DUKE UNIV PRESS,NA +positivity,1385-1292,1572-9281,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +post-communist economies,1463-1377,1465-3958,NA,0,1,0,0,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +post-medieval archaeology,0079-4236,1745-8137,NA,1,0,0,0,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +post-soviet affairs,1060-586X,1938-2855,NA,0,1,0,0,NA,Area Studies | Economics | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +postcolonial studies,1368-8790,1466-1888,NA,1,1,0,0,NA,Cultural Studies | History,History | Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +postcolonial studies,1368-8790,1466-1888,NA,1,1,0,0,NA,Cultural Studies | History,History | Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +postepy biologii komorki,0324-833X,2080-2218,NA,0,0,1,0,Cell Biology,NA,NA,POLSKIE TOWARZYSTWO ANATOMICZNE,NA +postepy dermatologii i alergologii,1642-395X,2299-0046,NA,0,0,1,0,Allergy | Dermatology,NA,NA,TERMEDIA PUBLISHING HOUSE LTD,NA +postepy higieny i medycyny doswiadczalnej,0032-5449,1732-2693,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,"POLISH ACAD SCIENCES, INST IMMUNOL & EXP THERAPY",NA +postepy w kardiologii interwencyjnej,1734-9338,1897-4295,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,TERMEDIA PUBLISHING HOUSE LTD,NA +postgraduate medical journal,0032-5473,1469-0756,PMJ_BMJ,0,0,1,1,"Medicine, General & Internal",NA,NA,BMJ PUBLISHING GROUP,2010-05-07 +postgraduate medicine,0032-5481,1941-9260,postgradmed,0,0,1,1,"Medicine, General & Internal",NA,NA,TAYLOR & FRANCIS LTD,2009-07-10 +postharvest biology and technology,0925-5214,1873-2356,NA,0,0,1,0,Agronomy | Food Science & Technology | Horticulture,NA,NA,ELSEVIER,NA +postmedieval-a journal of medieval cultural studies,2040-5960,2040-5979,postmedieval,1,1,0,1,NA,Cultural Studies,Cultural Studies | Medieval & Renaissance Studies,PALGRAVE MACMILLAN LTD,2009-08-03 +postmedieval-a journal of medieval cultural studies,2040-5960,2040-5979,postmedieval,1,1,0,1,NA,Cultural Studies,Cultural Studies | Medieval & Renaissance Studies,PALGRAVE MACMILLAN LTD,2009-08-03 +postmodern culture,1053-1920,1053-1920,PMC_Journal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,2021-04-05 +potato research,0014-3065,1871-4528,NA,0,0,1,0,Agronomy,NA,NA,SPRINGER,NA +potential analysis,0926-2601,1572-929X,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +poultry science,0032-5791,1525-3171,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,ELSEVIER,NA +powder diffraction,0885-7156,1945-7413,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,CAMBRIDGE UNIV PRESS,NA +powder metallurgy,0032-5899,1743-2901,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,TAYLOR & FRANCIS LTD,NA +powder metallurgy and metal ceramics,1068-1302,1573-9066,NA,0,0,1,0,"Materials Science, Ceramics | Metallurgy & Metallurgical Engineering",NA,NA,SPRINGER,NA +powder technology,0032-5910,1873-328X,NA,0,0,1,0,"Engineering, Chemical",NA,NA,ELSEVIER,NA +poznan studies in contemporary linguistics,1897-7499,1897-7499,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +poznan studies in contemporary linguistics,1897-7499,1897-7499,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +ppar research,1687-4757,1687-4765,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,HINDAWI LTD,NA +practical radiation oncology,1879-8500,1879-8500,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,NA +praehistorische zeitschrift,0079-4848,1613-0804,NA,1,1,0,0,NA,Anthropology,Archaeology,WALTER DE GRUYTER GMBH,NA +praehistorische zeitschrift,0079-4848,1613-0804,NA,1,1,0,0,NA,Anthropology,Archaeology,WALTER DE GRUYTER GMBH,NA +pragmatics,1018-2101,2406-4238,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +pragmatics,1018-2101,2406-4238,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +pragmatics & cognition,0929-0907,1569-9943,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +pragmatics & cognition,0929-0907,1569-9943,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +pragmatics and society,1878-9714,1878-9722,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +pragmatics and society,1878-9714,1878-9722,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +prague economic papers,1210-0455,2336-730X,NA,0,1,0,0,NA,Economics,NA,UNIV ECONOMICS-PRAGUE,NA +praktische metallographie-practical metallography,0032-678X,2195-8599,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,WALTER DE GRUYTER GMBH,NA +pramana-journal of physics,0304-4289,0973-7111,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,INDIAN ACAD SCIENCES,NA +pratiques psychologiques,1269-1763,NA,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +pratiques psychologiques,1269-1763,NA,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +praxis der kinderpsychologie und kinderpsychiatrie,0032-7034,2196-8225,NA,0,1,0,0,NA,"Psychology, Development | Psychiatry",NA,VANDENHOECK & RUPRECHT GMBH & CO KG,NA +precambrian research,0301-9268,1872-7433,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,ELSEVIER,NA +precision agriculture,1385-2256,1573-1618,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,SPRINGER,NA +precision engineering-journal of the international societies for precision engineering and nanotechnology,0141-6359,1873-2372,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Manufacturing | Nanoscience & Nanotechnology | Instruments & Instrumentation",NA,NA,ELSEVIER SCIENCE INC,NA +pregnancy hypertension-an international journal of womens cardiovascular health,2210-7789,2210-7789,NA,0,0,1,0,Obstetrics & Gynecology | Peripheral Vascular Diseases,NA,NA,ELSEVIER SCI LTD,NA +prehospital and disaster medicine,1049-023X,1945-1938,NA,0,0,1,0,Emergency Medicine,NA,NA,CAMBRIDGE UNIV PRESS,NA +prehospital emergency care,1090-3127,1545-0066,"NAEMSPJournal",0,0,1,1,"Emergency Medicine | Public, Environmental & Occupational Health",NA,NA,TAYLOR & FRANCIS INC,NA +prenatal diagnosis,0197-3851,1097-0223,NA,0,0,1,0,Genetics & Heredity | Obstetrics & Gynecology,NA,NA,WILEY,NA +preparative biochemistry & biotechnology,1082-6068,1532-2297,NA,0,0,1,0,Biochemical Research Methods | Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology,NA,NA,TAYLOR & FRANCIS INC,NA +presence-virtual and augmented reality,1054-7460,1531-3263,NA,0,0,1,0,"Computer Science, Cybernetics | Computer Science, Software Engineering",NA,NA,MIT PRESS,NA +preservation,1090-9931,NA,NA,1,0,0,0,NA,NA,History,"NATL TRUST HISTORIC PRESERVATION",NA +presidential studies quarterly,0360-4918,1741-5705,psq_cspc,0,1,0,1,NA,Political Science,NA,WILEY,2014-10-17 +preslia,0032-7786,0032-7786,preslia_botany,0,0,1,1,Plant Sciences,NA,NA,CZECH BOTANICAL SOC,2021-03-03 +presse medicale,0755-4982,2213-0276,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MASSON EDITEUR,NA +preventing chronic disease,1545-1151,1545-1151,CDCPCD,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,CENTERS DISEASE CONTROL & PREVENTION,2016-09-14 +preventing chronic disease,1545-1151,1545-1151,CDCPCD,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,CENTERS DISEASE CONTROL & PREVENTION,2016-09-14 +prevention science,1389-4986,1573-6695,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,SPRINGER/PLENUM PUBLISHERS,NA +preventive medicine,0091-7435,1096-0260,NA,0,0,1,0,"Public, Environmental & Occupational Health | Medicine, General & Internal",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +preventive medicine reports,2211-3355,2211-3355,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,ELSEVIER,NA +preventive veterinary medicine,0167-5877,1873-1716,NA,0,0,1,0,Veterinary Sciences,NA,NA,ELSEVIER,NA +primary care,0095-4543,1558-299X,NA,0,0,1,0,"Primary Health Care | Medicine, General & Internal",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +primary care diabetes,1751-9918,1878-0210,NA,0,0,1,0,Endocrinology & Metabolism | Primary Health Care,NA,NA,ELSEVIER SCI LTD,NA +primary health care research and development,1463-4236,1477-1128,NA,0,0,1,0,Primary Health Care,NA,NA,CAMBRIDGE UNIV PRESS,NA +primates,0032-8332,1610-7365,NA,0,0,1,0,Zoology,NA,NA,SPRINGER JAPAN KK,NA +primerjalna knjizevnost,0351-1189,0351-1189,NA,1,0,0,0,NA,NA,"Literature, Slavic",SLOVENE COMPARATIVE LITERATURE ASSOC,NA +print quarterly,0265-8305,NA,PrintQuarterly,1,0,0,1,NA,NA,Art,PRINT QUARTERLY PUBLICATIONS,2012-07-02 +prion,1933-6896,1933-690X,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,TAYLOR & FRANCIS INC,NA +prison journal,0032-8855,1552-7522,NA,0,1,0,0,NA,Criminology & Penology,NA,SAGE PUBLICATIONS INC,NA +probabilistic engineering mechanics,0266-8920,1878-4275,NA,0,0,1,0,"Engineering, Mechanical | Mechanics | Statistics & Probability",NA,NA,ELSEVIER SCI LTD,NA +probability and mathematical statistics-poland,0208-4147,2300-8113,NA,0,0,1,0,Statistics & Probability,NA,NA,WYDAWNICTWO UNIWERSYTETU WROCLAWSKIEGO,NA +probability in the engineering and informational sciences,0269-9648,1469-8951,NA,0,0,1,0,"Engineering, Industrial | Operations Research & Management Science | Statistics & Probability",NA,NA,CAMBRIDGE UNIV PRESS,NA +probability theory and related fields,0178-8051,1432-2064,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER HEIDELBERG,NA +probiotics and antimicrobial proteins,1867-1306,1867-1314,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,SPRINGER,NA +problemos,1392-1126,1392-1126,NA,1,0,0,0,NA,NA,Philosophy,"VILNIUS UNIV, DEPT PHILOSOPHY",NA +problems of information transmission,0032-9460,1608-3253,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,PLEIADES PUBLISHING INC,NA +problems of post-communism,1075-8216,1557-783X,NA,0,1,0,0,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +problemy ekorozwoju,1895-6912,2080-1971,NA,0,1,0,0,NA,Environmental Studies,NA,POLITECHNIKA LUBELSKA,NA +probus,0921-4771,1613-4079,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +probus,0921-4771,1613-4079,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +proceedings of the academy of natural sciences of philadelphia,0097-3157,1938-5293,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,ACAD NATURAL SCIENCES PHILA,NA +proceedings of the american mathematical society,0002-9939,1088-6826,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,AMER MATHEMATICAL SOC,NA +proceedings of the american philosophical society,0003-049X,2326-9243,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",AMER PHILOSOPHICAL SOC,NA +proceedings of the biological society of washington,0006-324X,1943-6327,NA,0,0,1,0,Biology,NA,NA,ALLEN PRESS INC,NA +proceedings of the combustion institute,1540-7489,1873-2704,NA,0,0,1,0,"Thermodynamics | Energy & Fuels | Engineering, Chemical | Engineering, Mechanical",NA,NA,ELSEVIER SCIENCE INC,NA +proceedings of the edinburgh mathematical society,0013-0915,1464-3839,NA,0,0,1,0,Mathematics,NA,NA,CAMBRIDGE UNIV PRESS,NA +proceedings of the entomological society of washington,0013-8797,0013-8797,NA,0,0,1,0,Entomology,NA,NA,ENTOMOL SOC WASHINGTON,NA +proceedings of the estonian academy of sciences,1736-6046,1736-7530,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,ESTONIAN ACAD PUBLISHERS,NA +proceedings of the geologists association,0016-7878,NA,NA,0,0,1,0,Geology | Paleontology,NA,NA,ELSEVIER SCI LTD,NA +proceedings of the ieee,0018-9219,1558-2256,ProceedingsIEEE,0,0,1,1,"Engineering, Electrical & Electronic",NA,NA,IEEE-INST ELECTRICAL ELECTRONICS ENGINEERS INC,2017-10-17 +proceedings of the indian academy of sciences-mathematical sciences,0253-4142,0973-7685,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER INDIA,NA +proceedings of the institution of civil engineers-civil engineering,0965-089X,1751-7672,NA,0,0,1,0,"Engineering, Civil",NA,NA,ICE PUBLISHING,NA +proceedings of the institution of civil engineers-energy,1751-4223,1751-4231,NA,0,0,1,0,Energy & Fuels,NA,NA,ICE PUBLISHING,NA +proceedings of the institution of civil engineers-engineering sustainability,1478-4629,1751-7680,NA,0,0,1,0,"Green & Sustainable Science & Technology | Engineering, Civil",NA,NA,ICE PUBLISHING,NA +proceedings of the institution of civil engineers-geotechnical engineering,1353-2618,1751-8563,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,ICE PUBLISHING,NA +proceedings of the institution of civil engineers-maritime engineering,1741-7597,1751-7737,NA,0,0,1,0,"Engineering, Civil | Engineering, Ocean | Water Resources",NA,NA,ICE PUBLISHING,NA +proceedings of the institution of civil engineers-municipal engineer,0965-0903,1751-7699,NA,0,0,1,0,"Engineering, Civil",NA,NA,ICE PUBLISHING,NA +proceedings of the institution of civil engineers-structures and buildings,0965-0911,1751-7702,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,ICE PUBLISHING,NA +proceedings of the institution of civil engineers-transport,0965-092X,1751-7710,NA,0,0,1,0,"Engineering, Civil | Transportation Science & Technology",NA,NA,ICE PUBLISHING,NA +proceedings of the institution of civil engineers-water management,1741-7589,1751-7729,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,ICE PUBLISHING,NA +proceedings of the institution of mechanical engineers part a-journal of power and energy,0957-6509,2041-2967,NA,0,0,1,0,"Thermodynamics | Engineering, Mechanical",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part b-journal of engineering manufacture,0954-4054,2041-1975,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Mechanical",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part c-journal of mechanical engineering science,0954-4062,2041-2983,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part d-journal of automobile engineering,0954-4070,2041-2991,NA,0,0,1,0,"Engineering, Mechanical | Transportation Science & Technology",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part e-journal of process mechanical engineering,0954-4089,2041-3009,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part f-journal of rail and rapid transit,0954-4097,2041-3017,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical | Transportation Science & Technology",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part g-journal of aerospace engineering,0954-4100,2041-3025,NA,0,0,1,0,"Engineering, Aerospace | Engineering, Mechanical",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part h-journal of engineering in medicine,0954-4119,2041-3033,NA,0,0,1,0,"Engineering, Biomedical",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part i-journal of systems and control engineering,0959-6518,2041-3041,NA,0,0,1,0,Automation & Control Systems,NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part j-journal of engineering tribology,1350-6501,2041-305X,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part k-journal of multi-body dynamics,1464-4193,2041-3068,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part l-journal of materials-design and applications,1464-4207,2041-3076,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part m-journal of engineering for the maritime environment,1475-0902,2041-3084,NA,0,0,1,0,"Engineering, Marine",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part o-journal of risk and reliability,1748-006X,1748-0078,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Industrial | Operations Research & Management Science",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the institution of mechanical engineers part p-journal of sports engineering and technology,1754-3371,1754-338X,NA,0,0,1,0,"Engineering, Mechanical | Sport Sciences",NA,NA,SAGE PUBLICATIONS LTD,NA +proceedings of the japan academy series a-mathematical sciences,0386-2194,NA,NA,0,0,1,0,Mathematics,NA,NA,JAPAN ACAD,NA +proceedings of the japan academy series b-physical and biological sciences,0386-2208,1349-2896,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,JAPAN ACAD,NA +proceedings of the linnean society of new south wales,0370-047X,NA,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,LINNEAN SOC NEW SOUTH WALES,NA +proceedings of the london mathematical society,0024-6115,1460-244X,NA,0,0,1,0,Mathematics,NA,NA,WILEY,NA +proceedings of the national academy of sciences india section a-physical sciences,0369-8203,2250-1762,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,"NATL ACAD SCIENCES INDIA",NA +proceedings of the national academy of sciences of the united states of america,0027-8424,1091-6490,PNASNews,0,0,1,1,Multidisciplinary Sciences,NA,NA,"NATL ACAD SCIENCES",2011-02-28 +proceedings of the nutrition society,0029-6651,1475-2719,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,CAMBRIDGE UNIV PRESS,NA +proceedings of the romanian academy series a-mathematics physics technical sciences information science,1454-9069,NA,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,EDITURA ACAD ROMANE,NA +proceedings of the royal irish academy section c-archaeology celtic studies history linguistics literature,0035-8991,2009-0048,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",ROYAL IRISH ACAD,NA +proceedings of the royal society a-mathematical physical and engineering sciences,1364-5021,1471-2946,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,ROYAL SOC,NA +proceedings of the royal society b-biological sciences,0962-8452,1471-2954,NA,0,0,1,0,Biology | Ecology | Evolutionary Biology,NA,NA,ROYAL SOC,NA +proceedings of the royal society of edinburgh section a-mathematics,0308-2105,1473-7124,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,CAMBRIDGE UNIV PRESS,NA +proceedings of the steklov institute of mathematics,0081-5438,1531-8605,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +proceedings of the vldb endowment,2150-8097,2150-8097,pvldb,0,0,1,1,"Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,ASSOC COMPUTING MACHINERY,2017-03-11 +proceedings of the yorkshire geological society,0044-0604,2041-4811,NA,0,0,1,0,Geology,NA,NA,GEOLOGICAL SOC PUBL HOUSE,NA +process biochemistry,1359-5113,1873-3298,NA,0,0,1,0,"Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Engineering, Chemical",NA,NA,ELSEVIER SCI LTD,NA +process safety and environmental protection,0957-5820,1744-3598,PSEPJournal,0,0,1,1,"Engineering, Environmental | Engineering, Chemical",NA,NA,ELSEVIER,2022-01-24 +process safety progress,1066-8527,1547-5913,NA,0,0,1,0,"Engineering, Chemical",NA,NA,WILEY,NA +processes,2227-9717,2227-9717,Processes_MDPI,0,0,1,1,"Engineering, Chemical",NA,NA,MDPI,2016-02-26 +processing and application of ceramics,1820-6131,2406-1034,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,"UNIV NOVI SAD, FAC TECHNOLOGY",NA +production and operations management,1059-1478,1937-5956,NA,0,0,1,0,"Engineering, Manufacturing | Operations Research & Management Science",NA,NA,WILEY,NA +production planning & control,0953-7287,1366-5871,NA,0,0,1,0,"Engineering, Industrial | Engineering, Manufacturing | Operations Research & Management Science",NA,NA,TAYLOR & FRANCIS LTD,NA +profesional de la informacion,1386-6710,1699-2407,revista_epi,0,1,0,1,NA,Communication | Information Science & Library Science,NA,EDICIONES PROFESIONALES INFORMACION SL-EPI,2009-03-21 +professional development in education,1941-5257,1941-5265,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +professional geographer,0033-0124,1467-9272,NA,0,1,0,0,NA,Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +professional psychology-research and practice,0735-7028,1939-1323,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +programming and computer software,0361-7688,1608-3261,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,PLEIADES PUBLISHING INC,NA +progres en urologie,1166-7087,1761-676X,P_UROL,0,0,1,1,Urology & Nephrology,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",2014-06-10 +progress in aerospace sciences,0376-0421,1873-1724,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in biochemistry and biophysics,1000-3282,1000-3282,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,"CHINESE ACAD SCIENCES, INST BIOPHYSICS",NA +progress in biophysics & molecular biology,0079-6107,1873-1732,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in brain research,0079-6123,1875-7855,NA,0,0,1,0,Neurosciences,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +progress in cardiovascular diseases,0033-0620,1873-1740,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +progress in chemistry,1005-281X,1005-281X,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,CHINESE ACAD SCIENCES,NA +progress in community health partnerships-research education and action,1557-0541,1557-055X,PCHP,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,JOHNS HOPKINS UNIV PRESS,2009-07-15 +progress in computational fluid dynamics,1468-4349,1741-5233,NA,0,0,1,0,Thermodynamics | Mechanics,NA,NA,INDERSCIENCE ENTERPRISES LTD,NA +progress in crystal growth and characterization of materials,0960-8974,1878-4208,NA,0,0,1,0,"Crystallography | Materials Science, Characterization, Testing",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in development studies,1464-9934,1477-027X,PIDSjournal,0,1,0,1,NA,Development Studies,NA,SAGE PUBLICATIONS INC,2021-10-12 +progress in earth and planetary science,2197-4284,2197-4284,PEPS_JpGU,0,0,1,1,"Geosciences, Multidisciplinary",NA,NA,SPRINGER,2015-04-01 +progress in electromagnetics research-pier,1070-4698,1559-8985,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied | Telecommunications",NA,NA,EMW PUBLISHING,NA +progress in energy and combustion science,0360-1285,1873-216X,NA,0,0,1,0,"Thermodynamics | Energy & Fuels | Engineering, Chemical | Engineering, Mechanical",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in human geography,0309-1325,1477-0288,proghumgeog,0,1,0,1,NA,Geography,NA,SAGE PUBLICATIONS LTD,2013-01-14 +progress in lipid research,0163-7827,1873-2194,NA,0,0,1,0,Biochemistry & Molecular Biology | Nutrition & Dietetics,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in materials science,0079-6425,1873-2208,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in molecular biology and translational science,1877-1173,1878-0814,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +progress in natural science-materials international,1002-0071,1745-5391,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCIENCE INC,NA +progress in neuro-psychopharmacology & biological psychiatry,0278-5846,1878-4216,NA,0,0,1,0,Clinical Neurology | Neurosciences | Pharmacology & Pharmacy | Psychiatry,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in neurobiology,0301-0082,1873-5118,NA,0,0,1,0,Neurosciences,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in nuclear energy,0149-1970,1878-4224,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in nuclear magnetic resonance spectroscopy,0079-6565,1873-3301,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical | Spectroscopy",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in nutrition,1129-8723,NA,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,MATTIOLI 1885,NA +progress in oceanography,0079-6611,1873-4472,NA,0,0,1,0,Oceanography,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in optics,0079-6638,NA,NA,0,0,1,0,Optics,NA,NA,ELSEVIER SCIENCE BV,NA +progress in organic coatings,0300-9440,1873-331X,NA,0,0,1,0,"Chemistry, Applied | Materials Science, Coatings & Films",NA,NA,ELSEVIER SCIENCE SA,NA +progress in orthodontics,2196-1042,2196-1042,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,SPRINGER,NA +progress in particle and nuclear physics,0146-6410,1873-2224,NA,0,0,1,0,"Physics, Nuclear | Physics, Particles & Fields",NA,NA,ELSEVIER,NA +progress in photovoltaics,1062-7995,1099-159X,NA,0,0,1,0,"Energy & Fuels | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,WILEY,NA +progress in physical geography-earth and environment,0309-1333,1477-0296,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,SAGE PUBLICATIONS LTD,NA +progress in planning,0305-9006,1873-4510,NA,0,1,0,0,NA,Environmental Studies | Regional & Urban Planning,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in polymer science,0079-6700,1873-1619,NA,0,0,1,0,Polymer Science,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in quantum electronics,0079-6727,1873-1627,NA,0,0,1,0,"Engineering, Electrical & Electronic | Quantum Science & Technology | Optics | Physics, Applied",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in reaction kinetics and mechanism,1468-6783,1471-406X,NA,0,0,1,0,"Chemistry, Physical",NA,NA,SAGE PUBLICATIONS LTD,NA +progress in retinal and eye research,1350-9462,1873-1635,NA,0,0,1,0,Ophthalmology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in rubber plastics and recycling technology,1477-7606,1478-2413,NA,0,0,1,0,"Materials Science, Composites | Polymer Science",NA,NA,SAGE PUBLICATIONS LTD,NA +progress in solid state chemistry,0079-6786,1873-1643,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in surface science,0079-6816,1878-4240,NA,0,0,1,0,"Chemistry, Physical | Physics, Condensed Matter",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +progress in transplantation,1526-9248,2164-6708,NA,0,0,1,0,Surgery | Transplantation,NA,NA,SAGE PUBLICATIONS INC,NA +progress in tumor research,0079-6263,2296-1887,NA,0,0,1,0,Oncology,NA,NA,KARGER,NA +progress of theoretical and experimental physics,2050-3911,2050-3911,PTEP_Official,0,0,1,1,"Physics, Multidisciplinary | Physics, Particles & Fields",NA,NA,OXFORD UNIV PRESS INC,2021-11-16 +project management journal,8756-9728,1938-9507,PMJ_editors,0,1,0,1,NA,Management,NA,SAGE PUBLICATIONS INC,2019-03-18 +prolegomena,1333-4395,1846-0593,NA,1,0,0,0,NA,NA,Philosophy,SOC ADVANCEMENT PHILOSOPHY-ZAGREB,NA +promet-traffic & transportation,0353-5320,1848-4069,NA,0,0,1,0,Transportation Science & Technology,NA,NA,"SVENCILISTE U ZAGREBU, FAKULTET PROMETNIH ZNANOSTI",NA +prooftexts-a journal of jewish literary history,0272-9601,1086-3311,NA,1,0,0,0,NA,NA,Literature,INDIANA UNIV PRESS,NA +propagation of ornamental plants,1311-9109,NA,NA,0,0,1,0,Horticulture,NA,NA,SEJANI PUBL,NA +propellants explosives pyrotechnics,0721-3115,1521-4087,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical",NA,NA,WILEY-V C H VERLAG GMBH,NA +propulsion and power research,2212-540X,2212-540X,NA,0,0,1,0,"Engineering, Aerospace | Thermodynamics | Engineering, Mechanical",NA,NA,ELSEVIER SCI LTD,NA +prospettiva-rivista di storia dell arte antica e moderna,0394-0802,2239-7205,NA,1,0,0,0,NA,NA,Art,CENTRO DI,NA +prostaglandins & other lipid mediators,1098-8823,2212-196X,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,ELSEVIER SCIENCE INC,NA +prostaglandins leukotrienes and essential fatty acids,0952-3278,1532-2823,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology | Endocrinology & Metabolism,NA,NA,ELSEVIER SCI LTD,NA +prostate,0270-4137,1097-0045,NA,0,0,1,0,Endocrinology & Metabolism | Urology & Nephrology,NA,NA,WILEY,NA +prostate cancer and prostatic diseases,1365-7852,1476-5608,pcan_journal,0,0,1,1,Oncology | Urology & Nephrology,NA,NA,SPRINGERNATURE,2014-05-20 +prostate international,2287-8882,2287-903X,NA,0,0,1,0,Urology & Nephrology,NA,NA,ELSEVIER INC,NA +prosthetics and orthotics international,0309-3646,1746-1553,NA,0,0,1,0,Orthopedics | Rehabilitation,NA,NA,SAGE PUBLICATIONS LTD,NA +prostor,1330-0652,1333-9117,NA,1,0,0,0,NA,NA,Architecture,UNIV ZAGREB FAC ARCHITECTURE,NA +protection of metals and physical chemistry of surfaces,2070-2051,2070-206X,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +protein & cell,1674-800X,1674-8018,Protein_Cell,0,0,1,1,Cell Biology,NA,NA,SPRINGER,2018-09-29 +protein and peptide letters,0929-8665,1875-5305,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +protein engineering design & selection,1741-0126,1741-0134,ProtEngDesSel,0,0,1,1,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology,NA,NA,OXFORD UNIV PRESS,2020-01-24 +protein expression and purification,1046-5928,1096-0279,NA,0,0,1,0,Biochemical Research Methods | Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +protein journal,1572-3887,1573-4943,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,SPRINGER,NA +protein science,0961-8368,1469-896X,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,WILEY,NA +proteins-structure function and bioinformatics,0887-3585,1097-0134,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,WILEY,NA +proteome science,1477-5956,1477-5956,NA,0,0,1,0,Biochemical Research Methods,NA,NA,BMC,NA +proteomics,1615-9853,1615-9861,NA,0,0,1,0,Biochemical Research Methods | Biochemistry & Molecular Biology,NA,NA,WILEY,NA +proteomics clinical applications,1862-8346,1862-8354,NA,0,0,1,0,Biochemical Research Methods,NA,NA,WILEY-V C H VERLAG GMBH,NA +proteus,0889-6348,NA,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",SHIPPENSBURG UNIV PENNSYLVANIA,NA +protist,1434-4610,1618-0941,NA,0,0,1,0,Microbiology,NA,NA,ELSEVIER GMBH,NA +protoplasma,0033-183X,1615-6102,NA,0,0,1,0,Plant Sciences | Cell Biology,NA,NA,SPRINGER WIEN,NA +proyecto progreso arquitectura,2171-6897,2173-1616,NA,1,0,0,0,NA,NA,Architecture,"UNIV SEVILLA, EDITORIAL",NA +przemysl chemiczny,0033-2496,0033-2496,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,WYDAWNICTWO SIGMA-N O T SP Z O O,NA +ps-political science & politics,1049-0965,1537-5935,ps_polisci,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2018-01-12 +psicologia-reflexao e critica,0102-7972,1678-7153,PsychResReview,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,SPRINGER INT PUBL AG,2016-10-07 +psicologia educativa,1135-755X,2174-0526,PsicologiaEduc1,0,1,0,1,NA,"Education & Educational Research | Psychology, Educational | Psychology, Multidisciplinary",NA,COLEGIO OFICIAL PSICOLOGOS MADRID,2018-07-23 +psicologica,0211-2159,1576-8597,NA,0,1,0,0,NA,"Psychology, Experimental",NA,SCIENDO,NA +psicothema,0214-9915,1886-144X,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,COLEGIO OFICIAL DE PSICOLOGOS DE ASTURIAS,NA +psihologija,0048-5705,1451-9283,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,ASSOC SERBIAN PSYCHOLOGISTS,NA +psikhologicheskii zhurnal,0205-9592,NA,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,MEZHDUNARODNAYA KNIGA,NA +psych journal,2046-0252,2046-0260,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,WILEY,NA +psyche-zeitschrift fur psychoanalyse und ihre anwendungen,0033-2623,NA,NA,0,1,0,0,NA,"Psychology, Psychoanalysis",NA,KLETT-COTTA VERLAG,NA +psychiatria danubina,0353-5053,NA,NA,0,1,1,0,Psychiatry,Psychiatry,NA,MEDICINSKA NAKLADA,NA +psychiatria danubina,0353-5053,NA,NA,0,1,1,0,Psychiatry,Psychiatry,NA,MEDICINSKA NAKLADA,NA +psychiatria polska,0033-2674,2391-5854,PsychiatrPol,0,0,1,1,Psychiatry,NA,NA,WYDAWNICZY POLSKIEGO TOWARZYSTWA,2018-11-27 +psychiatric annals,0048-5713,1938-2456,PsychAnnals,0,1,0,1,NA,Psychiatry,NA,SLACK INC,2012-04-24 +psychiatric clinics of north america,0193-953X,1558-3147,NA,0,1,0,0,NA,Psychiatry,NA,W B SAUNDERS CO-ELSEVIER INC,NA +psychiatric genetics,0955-8829,1473-5873,NA,0,0,1,0,Genetics & Heredity | Neurosciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +psychiatric quarterly,0033-2720,1573-6709,NA,0,1,0,0,NA,Psychiatry,NA,SPRINGER,NA +psychiatric rehabilitation journal,1095-158X,1559-3126,NA,0,1,0,0,NA,Psychiatry | Rehabilitation,NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychiatric services,1075-2730,1557-9700,NA,0,1,1,0,"Public, Environmental & Occupational Health | Psychiatry","Public, Environmental & Occupational Health | Health Policy & Services",NA,"AMER PSYCHIATRIC PUBLISHING, INC",NA +psychiatric services,1075-2730,1557-9700,NA,0,1,1,0,"Public, Environmental & Occupational Health | Psychiatry","Public, Environmental & Occupational Health | Health Policy & Services",NA,"AMER PSYCHIATRIC PUBLISHING, INC",NA +psychiatrie de l enfant,0079-726X,2102-5320,NA,0,1,1,0,Psychiatry,Psychiatry,NA,PRESSES UNIV FRANCE,NA +psychiatrie de l enfant,0079-726X,2102-5320,NA,0,1,1,0,Psychiatry,Psychiatry,NA,PRESSES UNIV FRANCE,NA +psychiatrische praxis,0303-4259,1439-0876,NA,0,1,0,0,NA,Psychiatry,NA,GEORG THIEME VERLAG KG,NA +psychiatry-interpersonal and biological processes,0033-2747,1943-281X,NA,0,1,1,0,Psychiatry,Psychiatry,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychiatry-interpersonal and biological processes,0033-2747,1943-281X,NA,0,1,1,0,Psychiatry,Psychiatry,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychiatry and clinical neurosciences,1323-1316,1440-1819,PCN_Psychiatry,0,0,1,1,Clinical Neurology | Neurosciences | Psychiatry,NA,NA,WILEY,2018-09-06 +psychiatry and clinical psychopharmacology,2475-0573,2475-0581,PsychClinP,0,0,1,1,Pharmacology & Pharmacy | Psychiatry,NA,NA,AVES,2021-10-25 +psychiatry investigation,1738-3684,1976-3026,NA,0,1,1,0,Psychiatry,Psychiatry,NA,KOREAN NEUROPSYCHIATRIC ASSOC,NA +psychiatry investigation,1738-3684,1976-3026,NA,0,1,1,0,Psychiatry,Psychiatry,NA,KOREAN NEUROPSYCHIATRIC ASSOC,NA +psychiatry psychology and law,1321-8719,1934-1687,NA,0,1,0,0,NA,"Criminology & Penology | Law | Psychiatry | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychiatry research,0165-1781,1872-7123,PsychiatryResJ,0,1,1,1,Psychiatry,Psychiatry,NA,ELSEVIER IRELAND LTD,NA +psychiatry research,0165-1781,1872-7123,PsychiatryResJ,0,1,1,1,Psychiatry,Psychiatry,NA,ELSEVIER IRELAND LTD,NA +psychiatry research-neuroimaging,0925-4927,1872-7506,NA,0,0,1,0,Clinical Neurology | Neuroimaging | Psychiatry,NA,NA,ELSEVIER IRELAND LTD,NA +psycho-oncologie,1778-3798,1778-381X,NA,0,0,1,0,Oncology | Psychology,NA,NA,LAVOISIER,NA +psycho-oncology,1057-9249,1099-1611,NA,0,1,1,0,Oncology | Psychology,"Psychology, Multidisciplinary | Social Sciences, Biomedical",NA,WILEY,NA +psycho-oncology,1057-9249,1099-1611,NA,0,1,1,0,Oncology | Psychology,"Psychology, Multidisciplinary | Social Sciences, Biomedical",NA,WILEY,NA +psychoanalysis and history,1460-8235,1755-201X,NA,1,1,0,0,NA,"History | History Of Social Sciences | Psychology, Psychoanalysis",History,EDINBURGH UNIV PRESS,NA +psychoanalysis and history,1460-8235,1755-201X,NA,1,1,0,0,NA,"History | History Of Social Sciences | Psychology, Psychoanalysis",History,EDINBURGH UNIV PRESS,NA +psychoanalytic dialogues,1048-1885,1940-9222,NA,0,1,0,0,NA,"Psychology, Psychoanalysis",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychoanalytic inquiry,0735-1690,1940-9133,NA,0,1,0,0,NA,"Psychology, Psychoanalysis",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychoanalytic psychology,0736-9735,1939-1331,NA,0,1,0,0,NA,"Psychology, Clinical | Psychology, Psychoanalysis",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychoanalytic quarterly,0033-2828,2167-4086,PsyQuarterly,0,1,0,1,NA,"Psychology, Psychoanalysis",NA,TAYLOR & FRANCIS INC,2018-04-03 +psychoanalytic study of the child,0079-7308,2474-3356,NA,0,1,0,0,NA,"Psychology, Psychoanalysis",NA,ROUTLEDGE,NA +psychogeriatrics,1346-3500,1479-8301,NA,0,0,1,0,Geriatrics & Gerontology | Psychiatry,NA,NA,WILEY,NA +psychologia,0033-2852,1347-5916,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,PSYCHOLOGIA SOC,NA +psychologica belgica,0033-2879,0033-2879,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,UBIQUITY PRESS LTD,NA +psychological assessment,1040-3590,1939-134X,NA,0,1,0,0,NA,"Psychology, Clinical",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychological bulletin,0033-2909,1939-1455,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychological bulletin,0033-2909,1939-1455,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychological inquiry,1047-840X,1532-7965,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychological medicine,0033-2917,1469-8978,NA,0,1,1,0,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,CAMBRIDGE UNIV PRESS,NA +psychological medicine,0033-2917,1469-8978,NA,0,1,1,0,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,CAMBRIDGE UNIV PRESS,NA +psychological methods,1082-989X,1939-1463,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychological record,0033-2933,2163-3452,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SPRINGER,NA +psychological reports,0033-2941,1558-691X,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +psychological research-psychologische forschung,0340-0727,1430-2772,NA,0,1,0,0,NA,"Psychology, Experimental",NA,SPRINGER HEIDELBERG,NA +psychological review,0033-295X,1939-1471,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychological review,0033-295X,1939-1471,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychological science,0956-7976,1467-9280,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +psychological science in the public interest,1529-1006,1539-6053,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS LTD,NA +psychological services,1541-1559,1939-148X,NA,0,1,0,0,NA,"Psychology, Clinical",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychological trauma-theory research practice and policy,1942-9681,1942-969X,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychologie francaise,0033-2984,NA,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +psychologie in erziehung und unterricht,0342-183X,NA,NA,0,1,0,0,NA,"Psychology, Educational",NA,ERNST REINHARDT GMBH CO VERLAG,NA +psychologische rundschau,0033-3042,2190-6238,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,HOGREFE VERLAG,NA +psychologist,0952-8229,0952-8229,psychmag,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,BRITISH PSYCHOLOGICAL SOC,2010-11-23 +psychology & health,0887-0446,1476-8321,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Psychology, Multidisciplinary",NA,TAYLOR & FRANCIS LTD,NA +psychology & marketing,0742-6046,1520-6793,PsychMarJournal,0,1,0,1,NA,"Business | Psychology, Applied",NA,WILEY,2021-01-05 +psychology & sexuality,1941-9899,1941-9902,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychology and aging,0882-7974,1939-1498,NA,0,1,0,0,NA,"Gerontology | Psychology, Development",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychology and psychotherapy-theory research and practice,1476-0835,2044-8341,NA,0,1,1,0,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,WILEY,NA +psychology and psychotherapy-theory research and practice,1476-0835,2044-8341,NA,0,1,1,0,Psychiatry | Psychology,"Psychiatry | Psychology, Clinical",NA,WILEY,NA +psychology crime & law,1068-316X,1477-2744,psycrimelaw,0,1,0,1,NA,"Criminology & Penology | Law | Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-08-12 +psychology health & medicine,1354-8506,1465-3966,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychology health & medicine,1354-8506,1465-3966,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychology in the schools,0033-3085,1520-6807,NA,0,1,0,0,NA,"Psychology, Educational",NA,WILEY,NA +psychology of addictive behaviors,0893-164X,1939-1501,NA,0,1,0,0,NA,"Substance Abuse | Psychology, Multidisciplinary",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychology of aesthetics creativity and the arts,1931-3896,1931-390X,NA,1,1,0,0,NA,"Psychology, Experimental","Humanities, Multidisciplinary",EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychology of aesthetics creativity and the arts,1931-3896,1931-390X,NA,1,1,0,0,NA,"Psychology, Experimental","Humanities, Multidisciplinary",EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychology of learning and motivation,0079-7421,NA,NA,0,1,0,0,NA,"Psychology, Experimental",NA,ELSEVIER ACADEMIC PRESS INC,NA +psychology of men & masculinities,1524-9220,1939-151X,NA,0,1,0,0,NA,"Psychology, Social",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychology of music,0305-7356,1741-3087,PsyofMus,1,1,0,1,NA,"Psychology, Educational | Psychology, Applied | Psychology, Experimental",Music,SAGE PUBLICATIONS INC,2014-02-01 +psychology of music,0305-7356,1741-3087,PsyofMus,1,1,0,1,NA,"Psychology, Educational | Psychology, Applied | Psychology, Experimental",Music,SAGE PUBLICATIONS INC,2014-02-01 +psychology of popular media,2689-6567,2689-6575,NA,0,1,0,0,NA,"Communication | Psychology, Multidisciplinary",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychology of religion and spirituality,1941-1022,1943-1562,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Religion,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychology of religion and spirituality,1941-1022,1943-1562,NA,1,1,0,0,NA,"Psychology, Multidisciplinary",Religion,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychology of sexual orientation and gender diversity,2329-0382,2329-0390,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychology of sexual orientation and gender diversity,2329-0382,2329-0390,NA,0,1,1,0,Psychology,"Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychology of sport and exercise,1469-0292,1878-5476,NA,0,1,1,0,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,ELSEVIER,NA +psychology of sport and exercise,1469-0292,1878-5476,NA,0,1,1,0,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,ELSEVIER,NA +psychology of violence,2152-0828,2152-081X,NA,0,1,0,0,NA,"Psychology, Clinical | Criminology & Penology | Family Studies",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +psychology of women quarterly,0361-6843,1471-6402,PWQ4U,0,1,0,1,NA,"Psychology, Multidisciplinary | Women'S Studies",NA,SAGE PUBLICATIONS LTD,2016-03-24 +psychology public policy and law,1076-8971,1939-1528,NA,0,1,0,0,NA,"Health Policy & Services | Law | Psychology, Multidisciplinary",NA,AMER PSYCHOLOGICAL ASSOC,NA +psychology research and behavior management,1179-1578,1179-1578,NA,0,1,0,0,NA,"Psychology, Clinical | Psychology, Multidisciplinary",NA,DOVE MEDICAL PRESS LTD,NA +psychometrika,0033-3123,1860-0980,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods | Psychology, Mathematical",NA,SPRINGER,NA +psychometrika,0033-3123,1860-0980,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods | Psychology, Mathematical",NA,SPRINGER,NA +psychoneuroendocrinology,0306-4530,1873-3360,PNECJournal,0,0,1,1,Endocrinology & Metabolism | Neurosciences | Psychiatry,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2021-01-30 +psychonomic bulletin & review,1069-9384,1531-5320,NA,0,1,0,0,NA,"Psychology, Mathematical | Psychology, Experimental",NA,SPRINGER,NA +psychopathology,0254-4962,1423-033X,NA,0,1,1,0,Psychiatry,Psychiatry,NA,KARGER,NA +psychopathology,0254-4962,1423-033X,NA,0,1,1,0,Psychiatry,Psychiatry,NA,KARGER,NA +psychopharmacology,0033-3158,1432-2072,NA,0,0,1,0,Neurosciences | Pharmacology & Pharmacy | Psychiatry,NA,NA,SPRINGER,NA +psychophysiology,0048-5772,1469-8986,NA,0,1,1,0,Neurosciences | Physiology | Psychology,"Psychology, Biological | Psychology, Experimental",NA,WILEY,NA +psychophysiology,0048-5772,1469-8986,NA,0,1,1,0,Neurosciences | Physiology | Psychology,"Psychology, Biological | Psychology, Experimental",NA,WILEY,NA +psychosis-psychological social and integrative approaches,1752-2439,1752-2447,NA,0,1,0,0,NA,"Psychology, Clinical | Psychiatry",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +psychosocial intervention,1132-0559,2173-4712,PsychosocialIn1,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,COLEGIO OFICIAL PSICOLOGOS MADRID,2018-08-22 +psychosomatic medicine,0033-3174,1534-7796,PsychosomMed,0,1,1,1,Psychiatry | Psychology,"Psychiatry | Psychology, Multidisciplinary",NA,LIPPINCOTT WILLIAMS & WILKINS,2009-07-02 +psychosomatic medicine,0033-3174,1534-7796,PsychosomMed,0,1,1,1,Psychiatry | Psychology,"Psychiatry | Psychology, Multidisciplinary",NA,LIPPINCOTT WILLIAMS & WILKINS,2009-07-02 +psychotherapeut,0935-6185,1432-2080,NA,0,1,0,0,NA,"Psychology, Clinical | Psychology, Psychoanalysis",NA,SPRINGER,NA +psychotherapie psychosomatik medizinische psychologie,0937-2032,1439-1058,NA,0,1,0,0,NA,"Psychology, Clinical",NA,GEORG THIEME VERLAG KG,NA +psychotherapy,0033-3204,1939-1536,NA,0,1,0,0,NA,"Psychology, Clinical",NA,"AMER PSYCHOLOGICAL ASSOC, DIV PSYCHOTHERAPY",NA +psychotherapy and psychosomatics,0033-3190,1423-0348,NA,0,1,1,0,Psychiatry | Psychology,Psychiatry,NA,KARGER,NA +psychotherapy and psychosomatics,0033-3190,1423-0348,NA,0,1,1,0,Psychiatry | Psychology,Psychiatry,NA,KARGER,NA +psychotherapy research,1050-3307,1468-4381,NA,0,1,0,0,NA,"Psychology, Clinical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +pteridines,0933-4807,0933-4807,NA,0,0,1,0,Biochemistry & Molecular Biology | Biophysics,NA,NA,WALTER DE GRUYTER GMBH,NA +public administration,0033-3298,1467-9299,journal_pa,0,1,0,1,NA,Political Science | Public Administration,NA,WILEY,2020-12-17 +public administration and development,0271-2075,1099-162X,NA,0,1,0,0,NA,Development Studies | Public Administration,NA,WILEY,NA +public administration review,0033-3352,1540-6210,PAReview,0,1,0,1,NA,Public Administration,NA,WILEY,2010-09-18 +public archaeology,1465-5187,1753-5530,PubArchJournal,1,0,0,1,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-10-23 +public choice,0048-5829,1573-7101,NA,0,1,0,0,NA,Economics | Political Science,NA,SPRINGER,NA +public culture,0899-2363,1527-8018,PubCultJournal,1,1,0,1,NA,Cultural Studies | Anthropology,Cultural Studies,DUKE UNIV PRESS,2012-01-23 +public culture,0899-2363,1527-8018,PubCultJournal,1,1,0,1,NA,Cultural Studies | Anthropology,Cultural Studies,DUKE UNIV PRESS,2012-01-23 +public health,0033-3506,1476-5616,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,W B SAUNDERS CO LTD,NA +public health,0033-3506,1476-5616,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,W B SAUNDERS CO LTD,NA +public health ethics,1754-9973,1754-9981,PHEthicsOUP,0,1,1,1,"Public, Environmental & Occupational Health | Medical Ethics","Public, Environmental & Occupational Health | Ethics",NA,OXFORD UNIV PRESS,2011-08-31 +public health ethics,1754-9973,1754-9981,PHEthicsOUP,0,1,1,1,"Public, Environmental & Occupational Health | Medical Ethics","Public, Environmental & Occupational Health | Ethics",NA,OXFORD UNIV PRESS,2011-08-31 +public health genomics,1662-4246,1662-8063,NA,0,1,1,0,"Genetics & Heredity | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,KARGER,NA +public health genomics,1662-4246,1662-8063,NA,0,1,1,0,"Genetics & Heredity | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,KARGER,NA +public health nursing,0737-1209,1525-1446,NA,0,1,1,0,"Public, Environmental & Occupational Health | Nursing","Public, Environmental & Occupational Health | Nursing",NA,WILEY,NA +public health nursing,0737-1209,1525-1446,NA,0,1,1,0,"Public, Environmental & Occupational Health | Nursing","Public, Environmental & Occupational Health | Nursing",NA,WILEY,NA +public health nutrition,1368-9800,1475-2727,NA,0,0,1,0,"Public, Environmental & Occupational Health | Nutrition & Dietetics",NA,NA,CAMBRIDGE UNIV PRESS,NA +public health reports,0033-3549,1468-2877,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +public health reports,0033-3549,1468-2877,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +public historian,0272-3433,1533-8576,NA,1,0,0,0,NA,NA,History,UNIV CALIFORNIA PRESS,NA +public management review,1471-9037,1471-9045,PMReview_,0,1,0,1,NA,Management | Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-03-31 +public money & management,0954-0962,1467-9302,NA,0,1,0,0,NA,Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +public opinion quarterly,0033-362X,1537-5331,NA,0,1,0,0,NA,"Communication | Political Science | Social Sciences, Interdisciplinary",NA,OXFORD UNIV PRESS,NA +public performance & management review,1530-9576,1557-9271,NA,0,1,0,0,NA,Public Administration,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +public personnel management,0091-0260,1945-7421,PPMgmtJournal,0,1,0,1,NA,Industrial Relations & Labor | Public Administration,NA,SAGE PUBLICATIONS INC,2013-04-17 +public policy and administration,0952-0767,1749-4192,NA,0,1,0,0,NA,Public Administration,NA,SAGE PUBLICATIONS LTD,NA +public relations review,0363-8111,1873-4537,NA,0,1,0,0,NA,Business | Communication,NA,ELSEVIER SCIENCE INC,NA +public understanding of science,0963-6625,1361-6609,scipublic,1,1,0,1,NA,History & Philosophy Of Science | Communication,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2015-11-02 +public understanding of science,0963-6625,1361-6609,scipublic,1,1,0,1,NA,History & Philosophy Of Science | Communication,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2015-11-02 +publicacions matematiques,0214-1493,0214-1493,NA,0,0,1,0,Mathematics,NA,NA,UNIV AUTONOMA BARCELONA,NA +publicationes mathematicae-debrecen,0033-3883,NA,NA,0,0,1,0,Mathematics,NA,NA,KOSSUTH LAJOS TUDOMANYEGYETEM,NA +publications mathematiques de l ihes,0073-8301,1618-1913,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER HEIDELBERG,NA +publications of the astronomical society of australia,1323-3580,1448-6083,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,CAMBRIDGE UNIV PRESS,NA +publications of the astronomical society of japan,0004-6264,2053-051X,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,OXFORD UNIV PRESS,NA +publications of the astronomical society of the pacific,0004-6280,1538-3873,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,IOP PUBLISHING LTD,NA +publications of the english goethe society,0959-3683,1749-6284,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +publications of the research institute for mathematical sciences,0034-5318,1663-4926,NA,0,0,1,0,Mathematics,NA,NA,"KYOTO UNIV, PUBLICATIONS RESEARCH INST MATHEMATICAL SCIENCES",NA +publishing history,0309-2445,NA,NA,1,0,0,0,NA,NA,History,PROQUEST LLC,NA +publius-the journal of federalism,0048-5950,1747-7107,NA,0,1,0,0,NA,Political Science,NA,OXFORD UNIV PRESS,NA +puerto rico health sciences journal,0738-0658,2373-6011,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,UNIV PUERTO RICO MEDICAL SCIENCES CAMPUS,NA +pulmonary circulation,2045-8932,2045-8940,PulmCirc,0,0,1,1,Cardiac & Cardiovascular System | Respiratory System,NA,NA,SAGE PUBLICATIONS INC,2013-02-14 +pulmonary pharmacology & therapeutics,1094-5539,1522-9629,NA,0,0,1,0,Pharmacology & Pharmacy | Respiratory System,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +pulmonology,2531-0437,2531-0437,NA,0,0,1,0,Respiratory System,NA,NA,ELSEVIER,NA +pulp & paper-canada,0316-4004,1923-3515,pulppapercanada,0,0,1,1,"Materials Science, Paper & Wood",NA,NA,PULP & PAPER CANADA MAGAZINE GROUP-BIG MAGAZINE LP,2015-07-28 +punishment & society-international journal of penology,1462-4745,1741-3095,Pun_Soc,0,1,0,1,NA,Criminology & Penology,NA,SAGE PUBLICATIONS LTD,2019-11-16 +pure and applied chemistry,0033-4545,1365-3075,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WALTER DE GRUYTER GMBH,NA +pure and applied geophysics,0033-4553,1420-9136,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SPRINGER BASEL AG,NA +pure and applied mathematics quarterly,1558-8599,1558-8602,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,"INT PRESS BOSTON, INC",NA +purinergic signalling,1573-9538,1573-9546,NA,0,0,1,0,Neurosciences,NA,NA,SPRINGER,NA +qjm-an international journal of medicine,1460-2725,1460-2393,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,OXFORD UNIV PRESS,NA +qme-quantitative marketing and economics,1570-7156,1573-711X,NA,0,1,0,0,NA,"Business | Economics | Social Sciences, Mathematical Methods",NA,SPRINGER,NA +quaderni d italianistica,0226-8043,0226-8043,NA,1,0,0,0,NA,NA,"Literature, Romance",QUADERNI D ITALIANISTICA,NA +quaderni storici,0301-6307,2612-1972,quadernistorici,1,0,0,1,NA,NA,History,SOC ED IL MULINO,NA +quaderni urbinati di cultura classica,0033-4987,1724-1901,NA,1,0,0,0,NA,NA,Classics,ACCADEMIA EDITORIALE PISA-ROMA,NA +quaestio rossica,2311-911X,2313-6871,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",URAL FEDERAL UNIV,NA +quaestiones mathematicae,1607-3606,1727-933X,NA,0,0,1,0,Mathematics,NA,NA,TAYLOR & FRANCIS LTD,NA +qualitative health research,1049-7323,1552-7557,NA,0,1,0,0,NA,"Information Science & Library Science | Social Sciences, Interdisciplinary | Social Sciences, Biomedical",NA,SAGE PUBLICATIONS INC,NA +qualitative inquiry,1077-8004,1552-7565,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +qualitative research,1468-7941,1741-3109,qrjcardiff,0,1,0,1,NA,"Social Sciences, Interdisciplinary | Sociology",NA,SAGE PUBLICATIONS LTD,2014-10-20 +qualitative research in accounting and management,1176-6093,1758-7654,NA,0,1,0,0,NA,"Business, Finance | Management",NA,EMERALD GROUP PUBLISHING LTD,NA +qualitative research in psychology,1478-0887,1478-0895,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +qualitative research in sport exercise and health,2159-676X,2159-6778,NA,0,1,1,0,Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +qualitative research in sport exercise and health,2159-676X,2159-6778,NA,0,1,1,0,Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +qualitative social work,1473-3250,1741-3117,QSWjournal,0,1,0,1,NA,Social Work,NA,SAGE PUBLICATIONS INC,2018-09-13 +qualitative sociology,0162-0436,1573-7837,qualsoc,0,1,0,1,NA,Sociology,NA,SPRINGER,2019-10-02 +qualitative theory of dynamical systems,1575-5460,1662-3592,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +quality and reliability engineering international,0748-8017,1099-1638,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Industrial | Operations Research & Management Science",NA,NA,WILEY,NA +quality assurance and safety of crops & foods,1757-8361,1757-837X,journalQAS,0,0,1,1,Food Science & Technology,NA,NA,CODON PUBLICATIONS,2017-11-13 +quality engineering,0898-2112,1532-4222,NA,0,0,1,0,"Engineering, Industrial | Statistics & Probability",NA,NA,TAYLOR & FRANCIS INC,NA +quality management in health care,1063-8628,1550-5154,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +quality management in health care,1063-8628,1550-5154,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +quality of life research,0962-9343,1573-2649,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,SPRINGER,NA +quality of life research,0962-9343,1573-2649,NA,0,1,1,0,"Health Care Sciences & Services | Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Health Policy & Services",NA,SPRINGER,NA +quality technology and quantitative management,1684-3703,1811-4857,NA,0,0,1,0,"Engineering, Industrial | Operations Research & Management Science | Statistics & Probability",NA,NA,TAYLOR & FRANCIS LTD,NA +quantitative economics,1759-7323,1759-7331,qe_editors,0,1,0,1,NA,Economics,NA,WILEY,2021-07-07 +quantitative finance,1469-7688,1469-7696,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Business, Finance | Economics | Social Sciences, Mathematical Methods",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +quantitative finance,1469-7688,1469-7696,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Business, Finance | Economics | Social Sciences, Mathematical Methods",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +quantitative imaging in medicine and surgery,2223-4292,2223-4306,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,AME PUBL CO,NA +quantitative infrared thermography journal,1768-6733,2116-7176,NA,0,0,1,0,"Instruments & Instrumentation | Materials Science, Characterization, Testing | Physics, Applied",NA,NA,TAYLOR & FRANCIS LTD,NA +quantum,2521-327X,2521-327X,quantumjournal,0,0,1,1,"Quantum Science & Technology | Physics, Multidisciplinary",NA,NA,VEREIN FORDERUNG OPEN ACCESS PUBLIZIERENS QUANTENWISSENSCHAF,2016-04-04 +quantum electronics,1063-7818,1468-4799,NA,0,0,1,0,"Engineering, Electrical & Electronic | Quantum Science & Technology | Physics, Applied",NA,NA,TURPION LTD,NA +quantum information & computation,1533-7146,1533-7146,NA,0,0,1,0,"Computer Science, Theory & Methods | Quantum Science & Technology | Physics, Particles & Fields | Physics, Mathematical",NA,NA,"RINTON PRESS, INC",NA +quantum information processing,1570-0755,1573-1332,QuantInfProcess,0,0,1,1,"Quantum Science & Technology | Physics, Multidisciplinary | Physics, Mathematical",NA,NA,SPRINGER,2015-05-14 +quantum science and technology,2058-9565,2058-9565,NA,0,0,1,0,"Quantum Science & Technology | Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +quantum topology,1663-487X,1664-073X,NA,0,0,1,0,Mathematics | Quantum Science & Technology,NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +quarterly journal of economics,0033-5533,1531-4650,QJEHarvard,0,1,0,1,NA,Economics,NA,OXFORD UNIV PRESS INC,2018-01-01 +quarterly journal of engineering geology and hydrogeology,1470-9236,2041-4803,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,GEOLOGICAL SOC PUBL HOUSE,NA +quarterly journal of experimental psychology,1747-0218,1747-0226,SageQJEP,0,1,1,1,Physiology | Psychology,"Psychology, Experimental",NA,SAGE PUBLICATIONS LTD,2018-01-06 +quarterly journal of experimental psychology,1747-0218,1747-0226,SageQJEP,0,1,1,1,Physiology | Psychology,"Psychology, Experimental",NA,SAGE PUBLICATIONS LTD,2018-01-06 +quarterly journal of mathematics,0033-5606,1464-3847,NA,0,0,1,0,Mathematics,NA,NA,OXFORD UNIV PRESS,NA +quarterly journal of mechanics and applied mathematics,0033-5614,1464-3855,NA,0,0,1,0,"Mathematics, Applied | Mechanics",NA,NA,OXFORD UNIV PRESS,NA +quarterly journal of nuclear medicine and molecular imaging,1824-4785,1827-1936,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,EDIZIONI MINERVA MEDICA,NA +quarterly journal of political science,1554-0626,1554-0634,qjps_editors,0,1,0,1,NA,Political Science,NA,NOW PUBLISHERS INC,2015-06-11 +quarterly journal of speech,0033-5630,1479-5779,NA,0,1,0,0,NA,Communication,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +quarterly journal of the royal meteorological society,0035-9009,1477-870X,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,WILEY,NA +quarterly of applied mathematics,0033-569X,1552-4485,NA,0,0,1,0,"Mathematics, Applied",NA,NA,BROWN UNIV,NA +quarterly review of biology,0033-5770,1539-7718,QRevBiol,0,0,1,1,Biology,NA,NA,UNIV CHICAGO PRESS,2021-06-10 +quarterly review of economics and finance,1062-9769,1878-4259,NA,0,1,0,0,NA,Economics,NA,ELSEVIER SCIENCE INC,NA +quarterly reviews of biophysics,0033-5835,1469-8994,NA,0,0,1,0,Biophysics,NA,NA,CAMBRIDGE UNIV PRESS,NA +quaternaire,1142-2904,1965-0795,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SOC GEOLOGIQUE FRANCE,NA +quaternary geochronology,1871-1014,1878-0350,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +quaternary international,1040-6182,1873-4553,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +quaternary research,0033-5894,1096-0287,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,NA +quaternary science reviews,0277-3791,1873-457X,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +queen mary journal of intellectual property,2045-9807,2045-9815,qmjip,0,1,0,1,NA,Law,NA,EDWARD ELGAR PUBLISHING LTD,2012-06-29 +queens quarterly,0033-6041,NA,QuarterlyQueens,1,0,0,1,NA,NA,Literary Reviews,QUEENS QUARTERLY,2020-10-01 +quest,0033-6297,1543-2750,NA,0,1,1,0,Sport Sciences,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +quest,0033-6297,1543-2750,NA,0,1,1,0,Sport Sciences,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +queueing systems,0257-0130,1572-9443,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Operations Research & Management Science",NA,NA,SPRINGER,NA +quimica nova,0100-4042,1678-7064,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SOC BRASILEIRA QUIMICA,NA +quintessence international,0033-6572,1936-7163,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,QUINTESSENCE PUBLISHING CO INC,NA +quinzaines-lettres arts et idees,2650-3794,2677-2507,LaQuinzaine,1,0,0,1,NA,NA,Literature,QUINZAINE LITTERAIRE,2011-06-09 +r & d management,0033-6807,1467-9310,RnDMgmtJournal,0,1,0,1,NA,Business | Management,NA,WILEY,2022-02-21 +r journal,2073-4859,NA,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Statistics & Probability",NA,NA,R FOUNDATION STATISTICAL COMPUTING,NA +ra-revista de arquitectura,1138-5596,2254-6332,NA,1,0,0,0,NA,NA,Architecture,"UNIV NAVARRA, SERVICIO PUBLICACIONES",NA +race & class,0306-3968,1741-3125,race_class,0,1,0,1,NA,"Anthropology | Ethnic Studies | Social Issues | Social Sciences, Interdisciplinary | Sociology",NA,SAGE PUBLICATIONS LTD,2014-03-26 +race and justice,2153-3687,2153-3687,NA,0,1,0,0,NA,Criminology & Penology | Ethnic Studies,NA,SAGE PUBLICATIONS INC,NA +race and social problems,1867-1748,1867-1756,NA,0,1,0,0,NA,"Ethnic Studies | Social Sciences, Interdisciplinary | Sociology",NA,SPRINGER,NA +race ethnicity and education,1361-3324,1470-109X,NA,0,1,0,0,NA,Education & Educational Research | Ethnic Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +radiation and environmental biophysics,0301-634X,1432-2099,NA,0,0,1,0,"Biology | Biophysics | Environmental Sciences | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,NA +radiation effects and defects in solids,1042-0150,1029-4953,NA,0,0,1,0,"Nuclear Science & Technology | Physics, Fluids & Plasmas | Physics, Condensed Matter",NA,NA,TAYLOR & FRANCIS LTD,NA +radiation measurements,1350-4487,1879-0925,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +radiation oncology,1748-717X,1748-717X,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,BMC,NA +radiation physics and chemistry,0969-806X,1879-0895,NA,0,0,1,0,"Chemistry, Physical | Nuclear Science & Technology | Physics, Atomic, Molecular & Chemical",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +radiation protection dosimetry,0144-8420,1742-3406,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health | Nuclear Science & Technology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,OXFORD UNIV PRESS,NA +radiation research,0033-7587,1938-5404,NA,0,0,1,0,"Biology | Biophysics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,RADIATION RESEARCH SOC,NA +radical history review,0163-6545,1534-1453,RadHistReview,1,0,0,1,NA,NA,History,DUKE UNIV PRESS,2012-01-14 +radical philosophy,0300-211X,0030-211X,rphilos,0,1,0,1,NA,Ethics | Women'S Studies,NA,RADICAL PHILOSOPHY,2010-06-30 +radio science,0048-6604,1944-799X,NA,0,0,1,0,Astronomy & Astrophysics | Geochemistry & Geophysics | Meteorology & Atmospheric Sciences | Remote Sensing | Telecommunications,NA,NA,AMER GEOPHYSICAL UNION,NA +radiocarbon,0033-8222,1945-5755,14Cjournal,0,0,1,1,Geochemistry & Geophysics,NA,NA,UNIV ARIZONA DEPT GEOSCIENCES,2014-05-20 +radiochimica acta,0033-8230,2193-3405,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Nuclear Science & Technology",NA,NA,WALTER DE GRUYTER GMBH,NA +radioengineering,1210-2512,1805-9600,radioengcz,0,0,1,1,"Engineering, Electrical & Electronic",NA,NA,SPOLECNOST PRO RADIOELEKTRONICKE INZENYRSTVI,2022-01-08 +radiographics,0271-5333,1527-1323,RadioGraphics,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,RADIOLOGICAL SOC NORTH AMERICA (RSNA),2010-11-09 +radiologe,0033-832X,1432-2102,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER HEIDELBERG,NA +radiologia medica,0033-8362,1826-6983,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +radiologic clinics of north america,0033-8389,1557-8275,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +radiology,0033-8419,0033-8419,radiology_rsna,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,RADIOLOGICAL SOC NORTH AMERICA (RSNA),2009-04-14 +radiology and oncology,1318-2099,1581-3207,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WALTER DE GRUYTER GMBH,NA +radiophysics and quantum electronics,0033-8443,1573-9120,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied | Physics, Fluids & Plasmas",NA,NA,SPRINGER,NA +radioprotection,0033-8451,1769-700X,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health | Nuclear Science & Technology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,EDP SCIENCES S A,NA +radiotherapy and oncology,0167-8140,1879-0887,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER IRELAND LTD,NA +radovi zavoda za povijesne znanosti hazu u zadru,1330-0474,1330-0474,NA,1,0,0,0,NA,NA,History,HRVATSKA AKAD ZNANOSTI UMJETNOSTI,NA +rae-revista de administracao de empresas,2178-938X,2178-938X,NA,0,1,0,0,NA,Business | Management,NA,FUNDACAO GETULIO VARGAS,NA +raffles bulletin of zoology,0217-2445,2345-7600,NA,0,0,1,0,Zoology,NA,NA,"NATL UNIV SINGAPOIRE, FAC SCIENCE,LEE KONG CHIAN NATURAL HISTORY MUSEUM",NA +rairo-operations research,0399-0559,1290-3868,NA,0,0,1,0,Operations Research & Management Science,NA,NA,EDP SCIENCES S A,NA +rairo-theoretical informatics and applications,0988-3754,1290-385X,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,EDP SCIENCES S A,NA +ramanujan journal,1382-4090,1572-9303,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +ramus-critical studies in greek and roman literature,0048-671X,2202-932X,NA,1,0,0,0,NA,NA,Classics,CAMBRIDGE UNIV PRESS,NA +rand journal of economics,0741-6261,1756-2171,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +random matrices-theory and applications,2010-3263,2010-3271,NA,0,0,1,0,"Physics, Mathematical | Statistics & Probability",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +random structures & algorithms,1042-9832,1098-2418,NA,0,0,1,0,"Computer Science, Software Engineering | Mathematics, Applied | Mathematics",NA,NA,WILEY,NA +range management and agroforestry,0971-2070,NA,NA,0,0,1,0,Agronomy,NA,NA,RANGE MANAGEMENT SOC INDIA,NA +rangeland ecology & management,1550-7424,1551-5028,NA,0,0,1,0,Ecology | Environmental Sciences,NA,NA,SOC RANGE MANAGEMENT,NA +rangeland journal,1036-9872,1834-7541,NA,0,0,1,0,Ecology,NA,NA,CSIRO PUBLISHING,NA +rapid communications in mass spectrometry,0951-4198,1097-0231,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical | Spectroscopy",NA,NA,WILEY,NA +rapid prototyping journal,1355-2546,1758-7670,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +rare metal materials and engineering,1002-185X,1002-185X,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,NORTHWEST INST NONFERROUS METAL RESEARCH,NA +rare metals,1001-0521,1867-7185,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,NONFERROUS METALS SOC CHINA,NA +raritan-a quarterly review,0275-1607,NA,RaritanQR,1,0,0,1,NA,NA,Literary Reviews,RARITAN-A QUARTERLY REVIEW,2015-07-14 +rassegna della letteratura italiana,0033-9423,NA,NA,1,0,0,0,NA,NA,"Literature, Romance",CASA EDITRICE G C SANSONI SPA,NA +rassegna storica del risorgimento,0033-9873,NA,NA,1,0,0,0,NA,NA,History,IST STOR RISORGIMENTO ITAL,NA +ratio,0034-0006,1467-9329,Ratiojournal,1,0,0,1,NA,NA,Philosophy,WILEY,2015-11-27 +rationality and society,1043-4631,1461-7358,NA,0,1,0,0,NA,Sociology,NA,SAGE PUBLICATIONS LTD,NA +rbgn-revista brasileira de gestao de negocios,1806-4892,1983-0807,NA,0,1,0,0,NA,Business | Management,NA,FUND ESCOLA COMERCIO ALVARES PENTEADO-FECAP,NA +reaction chemistry & engineering,2058-9883,2058-9883,RSC_ReactionEng,0,0,1,1,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,ROYAL SOC CHEMISTRY,2015-07-14 +reaction kinetics mechanisms and catalysis,1878-5190,1878-5204,NA,0,0,1,0,"Chemistry, Physical",NA,NA,SPRINGER,NA +reactive & functional polymers,1381-5148,1873-166X,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical | Polymer Science",NA,NA,ELSEVIER,NA +reading & writing quarterly,1057-3569,1521-0693,NA,0,1,0,0,NA,"Education & Educational Research | Education, Special",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +reading and writing,0922-4777,1573-0905,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,SPRINGER,NA +reading research quarterly,0034-0553,1936-2722,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,WILEY,NA +reading teacher,0034-0561,1936-2714,NA,0,1,0,0,NA,Education & Educational Research,NA,WILEY,NA +real-time systems,0922-6443,1573-1383,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,SPRINGER,NA +real estate economics,1080-8620,1540-6229,NA,0,1,0,0,NA,"Business, Finance | Economics | Urban Studies",NA,WILEY,NA +recall,0958-3440,1474-0109,ReCALLJnl,1,1,0,1,NA,Education & Educational Research | Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +recall,0958-3440,1474-0109,ReCALLJnl,1,1,0,1,NA,Education & Educational Research | Linguistics,Language & Linguistics,CAMBRIDGE UNIV PRESS,NA +recent patents on anti-cancer drug discovery,1574-8928,2212-3970,NA,0,0,1,0,Oncology | Pharmacology & Pharmacy,NA,NA,BENTHAM SCIENCE PUBL LTD,NA +recent patents on nanotechnology,1872-2105,2212-4020,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,BENTHAM SCIENCE PUBL LTD,NA +recherches de theologie et philosophie medievales,1370-7493,1783-1717,NA,1,0,0,0,NA,NA,Religion | Medieval & Renaissance Studies,PEETERS,NA +recht & psychiatrie,0724-2247,NA,NA,0,1,1,0,Psychiatry,Psychiatry | Criminology & Penology,NA,PSYCHIATRIE VERLAG GMBH,NA +recht & psychiatrie,0724-2247,NA,NA,0,1,1,0,Psychiatry,Psychiatry | Criminology & Penology,NA,PSYCHIATRIE VERLAG GMBH,NA +rechtsmedizin,0937-9819,1434-5196,NA,0,0,1,0,"Medicine, Legal",NA,NA,SPRINGER,NA +records of natural products,1307-6167,1307-6167,NA,0,0,1,0,"Plant Sciences | Chemistry, Applied | Chemistry, Medicinal",NA,NA,ACG PUBLICATIONS,NA +records of the australian museum,0067-1975,0067-1975,NA,0,0,1,0,Zoology,NA,NA,AUSTRALIAN MUSEUM,NA +redia-giornale di zoologia,0370-4327,0370-4327,NA,0,0,1,0,Zoology,NA,NA,CRA-RESEARCH CENTRE AGROBIOLOGY & PEDOLOGY,NA +redox biology,2213-2317,2213-2317,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,ELSEVIER,NA +redox report,1351-0002,1743-2928,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,TAYLOR & FRANCIS LTD,NA +reference & user services quarterly,1094-9054,2163-5242,NA,0,1,0,0,NA,Information Science & Library Science,NA,AMER LIBRARY ASSOC,NA +reference services review,0090-7324,2054-1716,ReferenceReview,0,1,0,1,NA,Information Science & Library Science,NA,EMERALD GROUP PUBLISHING LTD,NA +refractories and industrial ceramics,1083-4877,1573-9139,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,SPRINGER,NA +regenerative biomaterials,2056-3418,2056-3426,NA,0,0,1,0,"Materials Science, Biomaterials",NA,NA,OXFORD UNIV PRESS,NA +regenerative medicine,1746-0751,1746-076X,Regen_Med,0,0,1,1,"Cell & Tissue Engineering | Engineering, Biomedical",NA,NA,FUTURE MEDICINE LTD,2012-04-03 +regenerative therapy,2352-3204,2352-3204,NA,0,0,1,0,"Cell & Tissue Engineering | Engineering, Biomedical",NA,NA,ELSEVIER,NA +regional anesthesia and pain medicine,1098-7339,1532-8651,RAPMOnline,0,0,1,1,Anesthesiology,NA,NA,BMJ PUBLISHING GROUP,2011-07-27 +regional environmental change,1436-3798,1436-378X,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,SPRINGER HEIDELBERG,NA +regional environmental change,1436-3798,1436-378X,NA,0,1,1,0,Environmental Sciences,Environmental Studies,NA,SPRINGER HEIDELBERG,NA +regional science and urban economics,0166-0462,1879-2308,RegScUrbEc,0,1,0,1,NA,Economics | Environmental Studies | Urban Studies,NA,ELSEVIER,2021-01-18 +regional studies,0034-3404,1360-0591,regionalstudies,0,1,0,1,NA,Economics | Environmental Studies | Geography | Regional & Urban Planning,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2009-05-08 +regional studies in marine science,2352-4855,2352-4855,NA,0,0,1,0,Ecology | Marine & Freshwater Biology,NA,NA,ELSEVIER,NA +regular & chaotic dynamics,1560-3547,1468-4845,NA,0,0,1,0,"Mathematics, Applied | Mechanics | Physics, Mathematical",NA,NA,PLEIADES PUBLISHING INC,NA +regulation & governance,1748-5983,1748-5991,reggov_journal,0,1,0,1,NA,Law | Political Science | Public Administration,NA,WILEY,2019-10-01 +regulatory toxicology and pharmacology,0273-2300,1096-0295,NA,0,0,1,0,"Medicine, Legal | Pharmacology & Pharmacy | Toxicology",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +rehabilitation,0034-3536,1439-1309,NA,0,0,1,0,Rehabilitation,NA,NA,GEORG THIEME VERLAG KG,NA +rehabilitation counseling bulletin,0034-3552,1538-4853,NA,0,1,0,0,NA,Rehabilitation,NA,SAGE PUBLICATIONS INC,NA +rehabilitation nursing,0278-4807,2048-7940,NA,0,1,1,0,Nursing | Rehabilitation,Nursing | Rehabilitation,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +rehabilitation nursing,0278-4807,2048-7940,NA,0,1,1,0,Nursing | Rehabilitation,Nursing | Rehabilitation,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +rehabilitation psychology,0090-5550,1939-1544,NA,0,1,0,0,NA,"Psychology, Clinical | Rehabilitation",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +rejuvenation research,1549-1684,1557-8577,NA,0,0,1,0,Geriatrics & Gerontology,NA,NA,"MARY ANN LIEBERT, INC",NA +relations industrielles-industrial relations,0034-379X,1703-8138,RIIRUL,0,1,0,1,NA,Industrial Relations & Labor,NA,REVUE RELATIONS INDUSTRIELLES INDUSTRIAL RELATIONS,2021-02-25 +relc journal,0033-6882,1745-526X,NA,0,1,0,0,NA,Linguistics,NA,SAGE PUBLICATIONS LTD,NA +reliability engineering & system safety,0951-8320,1879-0836,RESS_Elsevier,0,0,1,1,"Engineering, Industrial | Operations Research & Management Science",NA,NA,ELSEVIER SCI LTD,2022-04-07 +religion,0048-721X,1096-1151,Religion1971,1,0,0,1,NA,NA,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-04-06 +religion & literature,0888-3769,2328-6911,ReligionandLit,1,0,0,1,NA,NA,Religion | Literature,UNIV NOTRE DAME,2017-10-05 +religion and american culture-a journal of interpretation,1052-1151,1533-8568,NA,1,0,0,0,NA,NA,Religion | History,CAMBRIDGE UNIV PRESS,NA +religion and the arts,1079-9265,1568-5292,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +religion brain & behavior,2153-599X,2153-5981,ReligBrainBehav,1,0,0,1,NA,NA,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-07-28 +religions,2077-1444,2077-1444,Religions_MDPI,1,0,0,1,NA,NA,Religion,MDPI,2014-04-01 +religious education,0034-4087,1547-3201,NA,1,0,0,0,NA,NA,Religion,TAYLOR & FRANCIS INC,NA +religious humanism,0034-4095,NA,NA,1,0,0,0,NA,NA,Religion,HUUMANISTS ASSOC,NA +religious studies,0034-4125,1469-901X,BloomsburyRS,1,0,0,1,NA,NA,Religion,CAMBRIDGE UNIV PRESS,2010-03-05 +religious studies review,0319-485X,1748-0922,NA,1,0,0,0,NA,NA,Religion,WILEY,NA +remedial and special education,0741-9325,1538-4756,NA,0,1,0,0,NA,"Education, Special",NA,SAGE PUBLICATIONS INC,NA +remote sensing,2072-4292,2072-4292,RemoteSens_MDPI,0,0,1,1,"Environmental Sciences | Geosciences, Multidisciplinary | Remote Sensing | Imaging Science & Photographic Technology",NA,NA,MDPI,2015-07-15 +remote sensing in ecology and conservation,2056-3485,2056-3485,RSECJournal,0,0,1,1,Ecology | Remote Sensing,NA,NA,WILEY,2014-06-11 +remote sensing letters,2150-704X,2150-7058,NA,0,0,1,0,Remote Sensing | Imaging Science & Photographic Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +remote sensing of environment,0034-4257,1879-0704,NA,0,0,1,0,Environmental Sciences | Remote Sensing | Imaging Science & Photographic Technology,NA,NA,ELSEVIER SCIENCE INC,NA +renaissance and reformation,0034-429X,0034-429X,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,RENAISSANCE AND REFORMATION,NA +renaissance quarterly,0034-4338,1935-0236,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,CAMBRIDGE UNIV PRESS,NA +renaissance studies,0269-1213,1477-4658,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,WILEY,NA +renal failure,0886-022X,1525-6049,NA,0,0,1,0,Urology & Nephrology,NA,NA,TAYLOR & FRANCIS LTD,NA +renascence-essays on values in literature,0034-4346,2329-8626,NA,1,0,0,0,NA,NA,Literature,MARQUETTE UNIV PRESS,NA +rendiconti del seminario matematico della universita di padova,0041-8994,2240-2926,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +rendiconti lincei-matematica e applicazioni,1120-6330,1720-0768,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +rendiconti lincei-scienze fisiche e naturali,2037-4631,1720-0776,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +renewable & sustainable energy reviews,1364-0321,1879-0690,NA,0,0,1,0,Green & Sustainable Science & Technology | Energy & Fuels,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +renewable agriculture and food systems,1742-1705,1742-1713,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,CAMBRIDGE UNIV PRESS,NA +renewable energy,0960-1481,1879-0682,NA,0,0,1,0,Green & Sustainable Science & Technology | Energy & Fuels,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +reports on mathematical logic,0137-2904,0137-2904,NA,0,0,1,0,Mathematics | Logic,NA,NA,"JAGIELLONIAN UNIV, THEORETICAL COMPUTER SCIENCE DEPT",NA +reports on mathematical physics,0034-4877,1879-0674,NA,0,0,1,0,"Physics, Mathematical",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +reports on progress in physics,0034-4885,1361-6633,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +representation theory,1088-4165,1088-4165,NA,0,0,1,0,Mathematics,NA,NA,AMER MATHEMATICAL SOC,NA +representations,0734-6018,1533-855X,rep_journal,1,1,0,1,NA,Cultural Studies,Cultural Studies,UNIV CALIFORNIA PRESS,2016-09-27 +representations,0734-6018,1533-855X,rep_journal,1,1,0,1,NA,Cultural Studies,Cultural Studies,UNIV CALIFORNIA PRESS,2016-09-27 +reproduction,1470-1626,1741-7899,ReprodJournal,0,0,1,1,Developmental Biology | Reproductive Biology,NA,NA,BIOSCIENTIFICA LTD,2015-07-19 +reproduction fertility and development,1031-3613,1448-5990,RepFertDev,0,0,1,1,Developmental Biology | Reproductive Biology | Zoology,NA,NA,CSIRO PUBLISHING,2020-11-27 +reproduction in domestic animals,0936-6768,1439-0531,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Reproductive Biology | Veterinary Sciences",NA,NA,WILEY,NA +reproductive biology,1642-431X,2300-732X,NA,0,0,1,0,Reproductive Biology,NA,NA,ELSEVIER,NA +reproductive biology and endocrinology,1477-7827,1477-7827,rbejournal,0,0,1,1,Endocrinology & Metabolism | Reproductive Biology,NA,NA,BMC,2020-01-03 +reproductive biomedicine online,1472-6483,1472-6491,RBMOnline,0,0,1,1,Obstetrics & Gynecology | Reproductive Biology,NA,NA,ELSEVIER SCI LTD,2016-11-23 +reproductive health,1742-4755,1742-4755,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,NA +reproductive health,1742-4755,1742-4755,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,BMC,NA +reproductive medicine and biology,1445-5781,1447-0578,NA,0,0,1,0,Obstetrics & Gynecology | Reproductive Biology,NA,NA,WILEY,NA +reproductive sciences,1933-7191,1933-7205,ReproSciences,0,0,1,1,Obstetrics & Gynecology | Reproductive Biology,NA,NA,SPRINGER HEIDELBERG,2020-10-27 +reproductive toxicology,0890-6238,1873-1708,NA,0,0,1,0,Reproductive Biology | Toxicology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +requirements engineering,0947-3602,1432-010X,ReqEngJ,0,0,1,1,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,SPRINGER,2016-10-11 +res philosophica,2168-9105,2168-9113,ResPhil,1,0,0,1,NA,NA,Philosophy,PHILOSOPHY DOCUMENTATION CENTER,2013-12-06 +res publica-a journal of moral legal and political philosophy,1356-4765,1572-8692,ResPublicaJrnl,1,0,0,1,NA,NA,Philosophy,SPRINGER,NA +research,2639-5274,2639-5274,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,AMER ASSOC ADVANCEMENT SCIENCE,NA +research-technology management,0895-6308,1930-0166,NA,0,1,1,0,"Engineering, Industrial",Business | Management,NA,TAYLOR & FRANCIS INC,NA +research-technology management,0895-6308,1930-0166,NA,0,1,1,0,"Engineering, Industrial",Business | Management,NA,TAYLOR & FRANCIS INC,NA +research & politics,2053-1680,2053-1680,res_pol,0,1,0,1,NA,Political Science,NA,SAGE PUBLICATIONS INC,2013-08-01 +research and practice for persons with severe disabilities,1540-7969,2169-2408,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,SAGE PUBLICATIONS INC,NA +research and theory for nursing practice,1541-6577,1945-7286,NA,0,1,1,0,Nursing,Nursing,NA,SPRINGER PUBLISHING CO,NA +research and theory for nursing practice,1541-6577,1945-7286,NA,0,1,1,0,Nursing,Nursing,NA,SPRINGER PUBLISHING CO,NA +research evaluation,0958-2029,1471-5449,NA,0,1,0,0,NA,Information Science & Library Science,NA,OXFORD UNIV PRESS,NA +research in african literatures,0034-5210,1527-2044,NA,1,0,0,0,NA,NA,"Literature, African, Australian, Canadian",INDIANA UNIV PRESS,NA +research in astronomy and astrophysics,1674-4527,2397-6209,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,"NATL ASTRONOMICAL OBSERVATORIES, CHIN ACAD SCIENCES",NA +research in autism spectrum disorders,1750-9467,1878-0237,NA,0,1,0,0,NA,"Education, Special | Psychology, Development | Psychiatry | Rehabilitation",NA,ELSEVIER SCI LTD,NA +research in dance education,1464-7893,1470-1111,NA,1,0,0,0,NA,NA,Dance,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +research in developmental disabilities,0891-4222,1873-3379,NA,0,1,0,0,NA,"Education, Special | Rehabilitation",NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +research in engineering design,0934-9839,1435-6066,NA,0,0,1,0,"Engineering, Multidisciplinary | Engineering, Industrial | Engineering, Manufacturing",NA,NA,SPRINGER HEIDELBERG,NA +research in gerontological nursing,1940-4921,1938-2464,RGNJournal,0,1,1,1,Nursing,Nursing,NA,SLACK INC,2009-12-10 +research in gerontological nursing,1940-4921,1938-2464,RGNJournal,0,1,1,1,Nursing,Nursing,NA,SLACK INC,2009-12-10 +research in higher education,0361-0365,1573-188X,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +research in human development,1542-7609,1542-7617,NA,0,1,0,0,NA,"Psychology, Development",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +research in international business and finance,0275-5319,1878-3384,NA,0,1,0,0,NA,"Business, Finance",NA,ELSEVIER,NA +research in microbiology,0923-2508,1769-7123,NA,0,0,1,0,Microbiology,NA,NA,ELSEVIER,NA +research in nondestructive evaluation,0934-9847,1432-2110,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,TAYLOR & FRANCIS INC,NA +research in nursing & health,0160-6891,1098-240X,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +research in nursing & health,0160-6891,1098-240X,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +research in organizational behavior,0191-3085,NA,NA,0,1,0,0,NA,"Psychology, Applied | Management",NA,ELSEVIER,NA +research in phenomenology,0085-5553,1569-1640,NA,1,0,0,0,NA,NA,Philosophy,HUMANITIES PRESS INC,NA +research in science & technological education,0263-5143,1470-1138,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +research in science education,0157-244X,1573-1898,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +research in social & administrative pharmacy,1551-7411,1934-8150,RSAPjournal,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,ELSEVIER SCIENCE INC,2009-05-27 +research in social stratification and mobility,0276-5624,1878-5654,NA,0,1,0,0,NA,Sociology,NA,ELSEVIER SCI LTD,NA +research in sports medicine,1543-8627,1543-8635,RiSportsMed,0,0,1,1,Sport Sciences,NA,NA,TAYLOR & FRANCIS LTD,2020-08-17 +research in the mathematical sciences,2522-0144,2197-9847,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER INT PUBL AG,NA +research in the teaching of english,0034-527X,NA,NA,0,1,0,0,NA,Education & Educational Research,NA,"NATL COUNCIL TEACHERS ENGLISH",NA +research in transportation business and management,2210-5395,2210-5409,NA,0,1,0,0,NA,Business | Management | Transportation,NA,ELSEVIER,NA +research in transportation economics,0739-8859,1875-7979,NA,0,1,0,0,NA,Economics | Transportation,NA,ELSEVIER SCI LTD,NA +research in veterinary science,0034-5288,1532-2661,NA,0,0,1,0,Veterinary Sciences,NA,NA,ELSEVIER SCI LTD,NA +research on aging,0164-0275,1552-7573,NA,0,1,0,0,NA,Gerontology,NA,SAGE PUBLICATIONS INC,NA +research on chemical intermediates,0922-6168,1568-5675,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER,NA +research on child and adolescent psychopathology,2730-7166,2730-7174,NA,0,1,0,0,NA,"Psychology, Clinical | Psychology, Development",NA,SPRINGER,NA +research on language and social interaction,0835-1813,1532-7973,rolsi_journal,0,1,0,1,NA,"Communication | Linguistics | Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-03-02 +research on social work practice,1049-7315,1552-7581,NA,0,1,0,0,NA,Social Work,NA,SAGE PUBLICATIONS INC,NA +research papers in education,0267-1522,1470-1146,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +research policy,0048-7333,1873-7625,NA,0,1,0,0,NA,Management,NA,ELSEVIER,NA +research quarterly for exercise and sport,0270-1367,2168-3824,NA,0,1,1,0,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +research quarterly for exercise and sport,0270-1367,2168-3824,NA,0,1,1,0,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +research synthesis methods,1759-2879,1759-2887,NA,0,0,1,0,Mathematical & Computational Biology | Multidisciplinary Sciences,NA,NA,WILEY,NA +resonancias,0717-3474,0719-5702,NA,1,0,0,0,NA,NA,Music,PONTIFICIA UNIV CATOLICA CHILE,NA +resource and energy economics,0928-7655,1873-0221,ResEnergyEcon,0,1,0,1,NA,Economics | Environmental Studies,NA,ELSEVIER,2022-01-18 +resource geology,1344-1698,1751-3928,NA,0,0,1,0,Geology | Mineralogy,NA,NA,WILEY,NA +resources conservation and recycling,0921-3449,1879-0658,RCRjournal,0,0,1,1,"Engineering, Environmental | Environmental Sciences",NA,NA,ELSEVIER,2017-10-23 +resources for american literary study,0048-7384,0048-7384,ForLiterary,1,0,0,1,NA,NA,"Literature, American",PENN STATE UNIV PRESS,2018-05-25 +resources policy,0301-4207,1873-7641,NA,0,1,0,0,NA,Environmental Studies,NA,ELSEVIER SCI LTD,NA +respiration,0025-7931,1423-0356,NA,0,0,1,0,Respiratory System,NA,NA,KARGER,NA +respiratory care,0020-1324,1943-3654,respcare,0,0,1,1,Critical Care Medicine | Respiratory System,NA,NA,DAEDALUS ENTERPRISES INC,2009-06-15 +respiratory medicine,0954-6111,1532-3064,resmedjournal,0,0,1,1,Cardiac & Cardiovascular System | Respiratory System,NA,NA,W B SAUNDERS CO LTD,2021-01-15 +respiratory medicine and research,2590-0412,2590-0412,NA,0,0,1,0,Respiratory System,NA,NA,ELSEVIER,NA +respiratory physiology & neurobiology,1569-9048,1878-1519,NA,0,0,1,0,Physiology | Respiratory System,NA,NA,ELSEVIER,NA +respiratory research,1465-993X,1465-993X,NA,0,0,1,0,Respiratory System,NA,NA,BMC,NA +respirology,1323-7799,1440-1843,NA,0,0,1,0,Respiratory System,NA,NA,WILEY,NA +restaurator-international journal for the preservation of library and archival material,0034-5806,1865-8431,NA,0,1,0,0,NA,Information Science & Library Science,NA,WALTER DE GRUYTER GMBH,NA +restoration ecology,1061-2971,1526-100X,NA,0,0,1,0,Ecology,NA,NA,WILEY,NA +restorative neurology and neuroscience,0922-6028,1878-3627,NA,0,0,1,0,Neurosciences,NA,NA,IOS PRESS,NA +results in mathematics,1422-6383,1420-9012,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER BASEL AG,NA +results in physics,2211-3797,2211-3797,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Multidisciplinary",NA,NA,ELSEVIER,NA +resuscitation,0300-9572,1873-1570,ResusJournal,0,0,1,1,Critical Care Medicine | Emergency Medicine,NA,NA,ELSEVIER IRELAND LTD,2021-11-23 +rethinking history,1364-2529,1470-1154,rethinkinghist,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-01-25 +rethinking history,1364-2529,1470-1154,rethinkinghist,1,1,0,1,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-01-25 +reti medievali rivista,1593-2214,1593-2214,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,FIRENZE UNIV PRESS,NA +retina-the journal of retinal and vitreous diseases,0275-004X,1539-2864,RetinaJournal,0,0,1,1,Ophthalmology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-06-20 +retrovirology,1742-4690,1742-4690,Retrovirology,0,0,1,1,Virology,NA,NA,BMC,2012-10-29 +review-literature and arts of the americas,0890-5762,1743-0666,NA,1,0,0,0,NA,NA,Literary Reviews,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +review journal of autism and developmental disorders,2195-7177,2195-7185,NA,0,1,0,0,NA,"Psychology, Development",NA,SPRINGER HEIDELBERG,NA +review of accounting studies,1380-6653,1573-7136,RastJournal,0,1,0,1,NA,"Business, Finance",NA,SPRINGER,2020-09-24 +review of african political economy,0305-6244,1740-1720,roapejournal,0,1,0,1,NA,Area Studies | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-10-17 +review of central and east european law,0925-9880,0925-9880,NA,0,1,0,0,NA,Law,NA,MARTINUS NIJHOFF PUBL,NA +review of cognitive linguistics,1877-9751,1877-976X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +review of cognitive linguistics,1877-9751,1877-976X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +review of derivatives research,1380-6645,1573-7144,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,SPRINGER,NA +review of development economics,1363-6669,1467-9361,NA,0,1,0,0,NA,Development Studies | Economics,NA,WILEY,NA +review of economic design,1434-4742,1434-4750,NA,0,1,0,0,NA,Economics,NA,SPRINGER HEIDELBERG,NA +review of economic dynamics,1094-2025,1096-6099,RevEconDyn,0,1,0,1,NA,Economics,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2020-07-23 +review of economic studies,0034-6527,1467-937X,RevEconStudies,0,1,0,1,NA,Economics,NA,OXFORD UNIV PRESS,2022-01-01 +review of economics and statistics,0034-6535,1530-9142,NA,0,1,0,0,NA,"Economics | Social Sciences, Mathematical Methods",NA,MIT PRESS,NA +review of economics of the household,1569-5239,1573-7152,NA,0,1,0,0,NA,Economics,NA,SPRINGER,NA +review of educational research,0034-6543,1935-1046,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +review of english studies,0034-6551,1471-6968,NA,1,0,0,0,NA,NA,Literature,OXFORD UNIV PRESS,NA +review of environmental economics and policy,1750-6816,1750-6824,NA,0,1,0,0,NA,Economics | Environmental Studies,NA,UNIV CHICAGO PRESS,NA +review of european comparative & international environmental law,2050-0386,2050-0394,recieljournal,0,1,0,1,NA,Environmental Studies | Law,NA,WILEY,2013-11-12 +review of faith & international affairs,1557-0274,1931-7743,NA,1,0,0,0,NA,NA,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +review of finance,1572-3097,1573-692X,NA,0,1,0,0,NA,"Business, Finance | Economics",NA,OXFORD UNIV PRESS,NA +review of financial studies,0893-9454,1465-7368,RevOfFinStudies,0,1,0,1,NA,"Business, Finance | Economics",NA,OXFORD UNIV PRESS INC,2019-05-09 +review of general psychology,1089-2680,1939-1552,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS INC,NA +review of higher education,0162-5748,1090-7009,RHE_ASHE,0,1,0,1,NA,Education & Educational Research,NA,JOHNS HOPKINS UNIV PRESS,2019-11-26 +review of income and wealth,0034-6586,1475-4991,ROIWeditors,0,1,0,1,NA,Economics,NA,WILEY,2021-07-15 +review of industrial organization,0889-938X,1573-7160,NA,0,1,0,0,NA,Economics | Management,NA,SPRINGER,NA +review of international economics,0965-7576,1467-9396,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +review of international organizations,1559-7431,1559-744X,NA,0,1,0,0,NA,Economics | International Relations | Political Science,NA,SPRINGER,NA +review of international political economy,0969-2290,1466-4526,ripejournal,0,1,0,1,NA,Economics | International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-05-26 +review of international studies,0260-2105,1469-9044,risjnl,0,1,0,1,NA,International Relations,NA,CAMBRIDGE UNIV PRESS,2013-06-06 +review of keynesian economics,2049-5323,2049-5331,NA,0,1,0,0,NA,Economics,NA,EDWARD ELGAR PUBLISHING LTD,NA +review of managerial science,1863-6683,1863-6691,NA,0,1,0,0,NA,Management,NA,SPRINGER HEIDELBERG,NA +review of metaphysics,0034-6632,2154-1302,NA,1,0,0,0,NA,NA,Philosophy,"PHILOSOPHY EDUCATION SOC, INC",NA +review of network economics,2194-5993,1446-9022,NA,0,1,0,0,NA,Economics,NA,WALTER DE GRUYTER GMBH,NA +review of palaeobotany and palynology,0034-6667,1879-0615,RPalaeoboPalyno,0,0,1,1,Plant Sciences | Paleontology,NA,NA,ELSEVIER,2021-03-04 +review of policy research,1541-132X,1541-1338,RPR_Journal,0,1,0,1,NA,Political Science | Public Administration,NA,WILEY,2021-06-30 +review of public personnel administration,0734-371X,1552-759X,ReviewofPPA,0,1,0,1,NA,Public Administration,NA,SAGE PUBLICATIONS INC,2017-12-17 +review of radical political economics,0486-6134,1552-8502,RRPENEWS,0,1,0,1,NA,Economics,NA,SAGE PUBLICATIONS INC,2010-01-25 +review of religious research,0034-673X,2211-4866,NA,1,1,0,0,NA,Sociology,Religion,SPRINGER HEIDELBERG,NA +review of religious research,0034-673X,2211-4866,NA,1,1,0,0,NA,Sociology,Religion,SPRINGER HEIDELBERG,NA +review of research in education,0091-732X,1935-1038,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +review of scientific instruments,0034-6748,1089-7623,NA,0,0,1,0,"Instruments & Instrumentation | Physics, Applied",NA,NA,AIP PUBLISHING,NA +review of symbolic logic,1755-0203,1755-0211,NA,1,0,1,0,"Mathematics, Applied | Mathematics | Logic",NA,Philosophy,CAMBRIDGE UNIV PRESS,NA +review of symbolic logic,1755-0203,1755-0211,NA,1,0,1,0,"Mathematics, Applied | Mathematics | Logic",NA,Philosophy,CAMBRIDGE UNIV PRESS,NA +review of world economics,1610-2878,1610-2886,NA,0,1,0,0,NA,Economics | International Relations,NA,SPRINGER,NA +reviews in american history,0048-7511,1080-6628,NA,1,0,0,0,NA,NA,History,JOHNS HOPKINS UNIV PRESS,NA +reviews in analytical chemistry,0793-0135,2191-0189,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,WALTER DE GRUYTER GMBH,NA +reviews in aquaculture,1753-5123,1753-5131,RAQjournal,0,0,1,1,Fisheries,NA,NA,WILEY,2021-01-13 +reviews in cardiovascular medicine,1530-6550,2153-8174,RCMjournal,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,IMR PRESS,2019-03-14 +reviews in chemical engineering,0167-8299,2191-0235,NA,0,0,1,0,"Engineering, Chemical",NA,NA,WALTER DE GRUYTER GMBH,NA +reviews in computational chemistry,1069-3599,NA,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,WILEY-BLACKWELL,NA +reviews in endocrine & metabolic disorders,1389-9155,1573-2606,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SPRINGER,NA +reviews in environmental science and bio-technology,1569-1705,1572-9826,NA,0,0,1,0,Biotechnology & Applied Microbiology | Environmental Sciences,NA,NA,SPRINGER,NA +reviews in fish biology and fisheries,0960-3166,1573-5184,RFBFisheries,0,0,1,1,Fisheries | Marine & Freshwater Biology,NA,NA,SPRINGER,2019-03-19 +reviews in fisheries science & aquaculture,2330-8249,2330-8257,NA,0,0,1,0,Fisheries,NA,NA,TAYLOR & FRANCIS INC,NA +reviews in inorganic chemistry,0193-4929,2191-0227,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,WALTER DE GRUYTER GMBH,NA +reviews in mathematical physics,0129-055X,1793-6659,NA,0,0,1,0,"Physics, Mathematical",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +reviews in medical virology,1052-9276,1099-1654,NA,0,0,1,0,Virology,NA,NA,WILEY,NA +reviews in mineralogy & geochemistry,1529-6466,1943-2666,NA,0,0,1,0,Geochemistry & Geophysics | Mineralogy,NA,NA,MINERALOGICAL SOC AMER & GEOCHEMICAL SOC,NA +reviews in the neurosciences,0334-1763,1607-8470,NA,0,0,1,0,Neurosciences,NA,NA,WALTER DE GRUYTER GMBH,NA +reviews of environmental contamination and toxicology,0179-5953,2197-6554,NA,0,0,1,0,Environmental Sciences | Toxicology,NA,NA,SPRINGER,NA +reviews of geophysics,8755-1209,1944-9208,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,AMER GEOPHYSICAL UNION,NA +reviews of modern physics,0034-6861,1539-0756,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,AMER PHYSICAL SOC,NA +reviews of physiology biochemistry and pharmacology,0303-4240,1617-5786,NA,0,0,1,0,Biochemistry & Molecular Biology | Pharmacology & Pharmacy | Physiology,NA,NA,SPRINGER-VERLAG BERLIN,NA +reviews on advanced materials science,1606-5131,1605-8127,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,DE GRUYTER POLAND SP Z O O,NA +reviews on environmental health,0048-7554,2191-0308,NA,0,0,1,0,"Environmental Sciences | Public, Environmental & Occupational Health",NA,NA,WALTER DE GRUYTER GMBH,NA +revija za kriminalistiko in kriminologijo,0034-690X,NA,NA,0,1,0,0,NA,Criminology & Penology,NA,MINISTRY INTERIOR REPUBLIC SLOVENIA,NA +revija za socijalnu politiku,1330-2965,1845-6014,NA,0,1,0,0,NA,Social Issues,NA,"SVEUCLISTE ZAGREBU, PRAVNI FAKULTED-UNIV ZAGREB, FAC LAW",NA +revista 180,0718-2309,0718-2309,umoitozero,1,0,0,1,NA,NA,Architecture,UNIV DIEGO PORTALES,2020-07-29 +revista argentina de microbiologia,0325-7541,1851-7617,NA,0,0,1,0,Microbiology,NA,NA,ASOCIACION ARGENTINA MICROBIOLOGIA,NA +revista arvore,0100-6762,1806-9088,NA,0,0,1,0,Forestry,NA,NA,UNIV FEDERAL VICOSA,NA +revista brasileira de ciencia do solo,0100-0683,0100-0683,RBCS_SoilSci,0,0,1,1,Soil Science,NA,NA,SOC BRASILEIRA DE CIENCIA DO SOLO,2019-02-28 +revista brasileira de engenharia agricola e ambiental,1415-4366,1807-1929,NA,0,0,1,0,Agricultural Engineering,NA,NA,UNIV FEDERAL CAMPINA GRANDE,NA +revista brasileira de entomologia,0085-5626,1806-9665,NA,0,0,1,0,Entomology,NA,NA,SOC BRASILEIRA ENTOMOLOGIA,NA +revista brasileira de farmacognosia-brazilian journal of pharmacognosy,0102-695X,1981-528X,NA,0,0,1,0,"Chemistry, Medicinal | Pharmacology & Pharmacy",NA,NA,SPRINGERNATURE,NA +revista brasileira de fruticultura,0100-2945,1806-9967,NA,0,0,1,0,Horticulture,NA,NA,SOC BRASILEIRA FRUTICULTURA,NA +revista brasileira de historia,0102-0188,1806-9347,RBH_ANPUH,1,0,0,1,NA,NA,History,ASSOC NAC HISTORIA-ANPUH,2020-04-06 +revista brasileira de medicina do esporte,1517-8692,1806-9940,NA,0,0,1,0,Physiology | Sport Sciences,NA,NA,SOC BRASILEIRA MED ESPORTE,NA +revista brasileira de paleontologia,1519-7530,2236-1715,NA,0,0,1,0,Paleontology,NA,NA,SOC BRASILEIRA PALEONTOLOGIA,NA +revista brasileira de parasitologia veterinaria,0103-846X,1984-2961,RevistaBrasile1,0,0,1,1,Parasitology | Veterinary Sciences,NA,NA,BRAZILIAN COLL VETERINARY PARASITOLOGY,2018-10-01 +revista brasileira de politica internacional,0034-7329,1983-3121,ibri_rbpi,0,1,0,1,NA,International Relations | Political Science,NA,INST BRASILEIRO RELACOES INT,2010-04-20 +revista brasileira de zootecnia-brazilian journal of animal science,1516-3598,1806-9290,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,REVISTA BRASILEIRA ZOOTECNIA BRAZILIAN JOURNAL ANIMAL SCI,NA +revista caatinga,0100-316X,1983-2125,NA,0,0,1,0,Agronomy,NA,NA,UNIV FED RURAL SEMI-ARIDO-UFERSA,NA +revista chapingo serie ciencias forestales y del ambiente,2007-3828,2007-4018,NA,0,0,1,0,Forestry,NA,NA,UNIV AUTONOMA CHAPINGO,NA +revista chilena de derecho,0718-3437,0718-3437,rchderecho,0,1,0,1,NA,Law,NA,PONTIFICA UNIV CATOLICA DE CHILE FACULTAD DE DERECHO,2012-08-16 +revista chilena de historia natural,0716-078X,0717-6317,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,SOC BIOLGIA CHILE,NA +revista chilena de infectologia,0716-1018,0717-6341,NA,0,0,1,0,Infectious Diseases,NA,NA,SOC CHILENA INFECTOLOGIA,NA +revista chilena de literatura,0718-2295,0718-2295,NA,1,0,0,0,NA,NA,"Literature, Romance","UNIV CHILE, FAC FILOS HUMAN EDUC",NA +revista ciencia agronomica,0045-6888,1806-6690,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,"UNIV FEDERAL CEARA, DEPT GEOL",NA +revista cientifica-facultad de ciencias veterinarias,0798-2259,2521-9715,NA,0,0,1,0,Veterinary Sciences,NA,NA,"UNIV ZULIA, FACULTAD CIENCIAS VETERINARIAS",NA +revista clinica espanola,0014-2565,1578-1860,RCE_SEMI,0,0,1,1,"Medicine, General & Internal",NA,NA,EDICIONES DOYMA S A,2018-03-08 +revista colombiana de ciencias pecuarias,0120-0690,2256-2958,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,"UNIV ANTIOQUIA, FAC CIENCIAS AGRARIAS",NA +revista colombiana de entomologia,0120-0488,0120-0488,NA,0,0,1,0,Entomology,NA,NA,SOC COLOMBIANA ENTOMOLOGIA-SOCOLEN,NA +revista da associacao medica brasileira,NA,1806-9282,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ASSOC MEDICA BRASILEIRA,NA +revista da escola de enfermagem da usp,0080-6234,1980-220X,NA,0,1,1,0,Nursing,Nursing,NA,UNIV SAO PAOLO,NA +revista da escola de enfermagem da usp,0080-6234,1980-220X,NA,0,1,1,0,Nursing,Nursing,NA,UNIV SAO PAOLO,NA +revista da sociedade brasileira de medicina tropical,0037-8682,1678-9849,NA,0,0,1,0,Parasitology | Tropical Medicine,NA,NA,SOC BRASILEIRA MEDICINA TROPICAL,NA +revista de biologia marina y oceanografia,0717-3326,0718-1957,revbiolmar,0,0,1,1,Marine & Freshwater Biology | Oceanography,NA,NA,UNIV VALPARAISO,2011-02-14 +revista de biologia tropical,0034-7744,2215-2075,RevBiolTrop,0,0,1,1,Biology,NA,NA,REVISTA DE BIOLOGIA TROPICAL,2018-01-26 +revista de ciencia politica,0718-090X,0718-090X,icp_uc,0,1,0,1,NA,Political Science,NA,"PONTIFICIA UNIV CATOLICA CHILE, INST CIENCIA POLITICA",2012-07-26 +revista de contabilidad-spanish accounting review,1138-4891,1988-4672,NA,0,1,0,0,NA,"Business, Finance",NA,EDIT UM-EDICIONES UNIV MURCIA,NA +revista de economia mundial,1576-0162,2340-4264,NA,0,1,0,0,NA,Economics,NA,"UNIV HUELVA, SERV PUBLICACIONES",NA +revista de educacion,0034-8082,1988-592X,NA,0,1,0,0,NA,Education & Educational Research,NA,MINISTRY EDUCATION & SCIENCE,NA +revista de estudios hispanicos,0034-818X,0034-818X,NA,1,0,0,0,NA,NA,"Literature, Romance",REVISTA DE ESTUDIOS HISPANICOS,NA +revista de estudios politicos,0048-7694,1989-0613,rep_cepc,0,1,0,1,NA,Political Science,NA,CENTRO ESTUDIOS POLITICOS CONSTITUCIONALES,2021-11-03 +revista de estudios sociales,0123-885X,1900-5180,NA,0,1,0,0,NA,"Social Issues | Social Sciences, Interdisciplinary",NA,UNIV ANDES,NA +revista de etnografie si folclor-journal of ethnography and folklore,0034-8198,0034-8198,NA,1,0,0,0,NA,NA,Folklore,EDITURA ACAD ROMANE,NA +revista de filologia espanola,0210-9174,1988-8538,NA,1,0,0,0,NA,NA,"Language & Linguistics | Literature, Romance",CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +revista de filosofia,0034-8236,0718-4360,RevFilosofiaUCM,1,0,0,1,NA,NA,Philosophy,"UNIV CHILE, FAC FILOSOFIA & HUMANIDADES",2019-04-15 +revista de filosofia aurora,0104-4443,1980-5934,NA,1,0,0,0,NA,NA,Philosophy,PONTIFICIA UNIV CATOLICA PARANA,NA +revista de geografia norte grande,0379-8682,0718-3402,NA,0,1,1,0,"Geography, Physical",Geography,NA,"PONTIFICA UNIV CATOLICA CHILE, INST GEOGRAFIA",NA +revista de geografia norte grande,0379-8682,0718-3402,NA,0,1,1,0,"Geography, Physical",Geography,NA,"PONTIFICA UNIV CATOLICA CHILE, INST GEOGRAFIA",NA +revista de hispanismo filosofico,1136-8071,1136-8071,NA,1,0,0,0,NA,NA,Philosophy,FONDO CULTURA ECONOMICA ESPANA S L,NA +revista de historia da sociedade e da cultura,1645-2259,2183-8615,NA,1,0,0,0,NA,NA,History,"UNIV COIMBRA, FAC LETRAS",NA +revista de historia economica,0212-6109,2041-3335,NA,0,1,0,0,NA,Economics | History | History Of Social Sciences,NA,CAMBRIDGE UNIV PRESS,NA +revista de historia industrial,1132-7200,2385-3247,NA,1,1,0,0,NA,History | Business | Economics | History Of Social Sciences,History,"UNIV BARCELONA, DEPT HISTORIA, INST ECONOMIQUES",NA +revista de historia industrial,1132-7200,2385-3247,NA,1,1,0,0,NA,History | Business | Economics | History Of Social Sciences,History,"UNIV BARCELONA, DEPT HISTORIA, INST ECONOMIQUES",NA +revista de indias,0034-8341,1988-3188,NA,1,0,0,0,NA,NA,History,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +revista de investigacion clinica-clinical and translational investigation,0034-8376,2564-8896,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,INST NACIONAL NUTRICION,NA +revista de la construccion,0718-915X,0718-915X,revistaconstr,0,0,1,1,"Construction & Building Technology | Engineering, Civil",NA,NA,"PONTIFICIA UNIV CATOLICA CHILE, ESCUELA CONSTRUCCION CIVIL",2021-05-26 +revista de la facultad de agronomia de la universidad del zulia,0378-7818,2477-9407,NA,0,0,1,0,Agronomy,NA,NA,"UNIV ZULIA, FACULTAD AGRONOMIA",NA +revista de la facultad de ciencias agrarias,0370-4661,1853-8665,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,"UNIV NACIONAL CUYO, FAC CIENCIAS AGRARIAS",NA +revista de la real academia de ciencias exactas fisicas y naturales serie a-matematicas,1578-7303,1579-1505,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +revista de la sociedad entomologica argentina,0373-5680,1851-7471,NA,0,0,1,0,Entomology,NA,NA,SOC ENTOMOLOGICA ARGENTINA,NA +revista de la union matematica argentina,0041-6932,1669-9637,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,UNION MATEMATICA ARGENTINA,NA +revista de letras,0101-3505,1981-7886,revistadeletras,1,0,0,1,NA,NA,Literary Theory & Criticism,UNIV ESTADUAL PAULISTA-UNESP,2009-06-22 +revista de literatura,0034-849X,1988-4192,NA,1,0,0,0,NA,NA,"Literature, Romance",CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +revista de metalurgia,0034-8570,1988-4222,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +revista de nefrologia dialisis y trasplante,0326-3428,2346-8548,NA,0,0,1,0,Urology & Nephrology,NA,NA,ASOC REGIONAL DIALISIS TRASPLANTES RENALES,NA +revista de neurologia,0210-0010,1576-6578,NA,0,0,1,0,Clinical Neurology,NA,NA,REVISTA DE NEUROLOGIA,NA +revista de nutricao-brazilian journal of nutrition,1415-5273,1678-9865,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,PONTIFICIA UNIVERSIDADE CATOLICA CAMPINAS,NA +revista de occidente,0034-8635,0034-8635,RevOccidente,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",FUNDACION JOSE ORTEGA Y GASSET,2015-02-03 +revista de psicodidactica,1136-1034,2254-4372,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,ELSEVIER ESPANA,NA +revista de psicologia del deporte,1132-239X,1988-5636,RevPsicoDep,0,1,0,1,NA,"Psychology, Applied",NA,UNIV ILLES BALEARS,2017-01-31 +revista de psiquiatria y salud mental,1888-9891,1989-4600,NA,0,1,1,0,Psychiatry,Psychiatry,NA,ELSEVIER ESPANA SLU,NA +revista de psiquiatria y salud mental,1888-9891,1989-4600,NA,0,1,1,0,Psychiatry,Psychiatry,NA,ELSEVIER ESPANA SLU,NA +revista de saude publica,0034-8910,1518-8787,rsp_usp,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,REVISTA DE SAUDE PUBLICA,2015-03-24 +revista de saude publica,0034-8910,1518-8787,rsp_usp,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,REVISTA DE SAUDE PUBLICA,2015-03-24 +revista del clad reforma y democracia,1315-2378,NA,NA,0,1,0,0,NA,Political Science | Public Administration,NA,CLAD-LATINOAMERICANO ADMINISTRACION DESARROLLO,NA +revista do instituto de medicina tropical de sao paulo,0036-4665,1678-9946,NA,0,0,1,0,Infectious Diseases | Parasitology | Tropical Medicine,NA,NA,INST MEDICINA TROPICAL SAO PAULO,NA +revista espanola de cardiologia,0300-8932,1579-2242,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,EDICIONES DOYMA S A,NA +revista espanola de derecho constitucional,0211-5743,1989-0648,redc_cepc,0,1,0,1,NA,Law,NA,CENTRO ESTUDIOS POLITICOS CONSTITUCIONALES,2019-01-23 +revista espanola de documentacion cientifica,0210-0614,1988-4621,Revista_REDOC,0,1,0,1,NA,Information Science & Library Science,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,2021-05-24 +revista espanola de enfermedades digestivas,1130-0108,2340-4167,REEDigestivas,0,0,1,1,Gastroenterology & Hepatology,NA,NA,"ARAN EDICIONES, S A",2018-02-14 +revista espanola de investigaciones sociologicas,0210-5233,1988-5903,NA,0,1,0,0,NA,Sociology,NA,CENTRO INVESTIGACIONES SOCIOLOGICAS,NA +revista espanola de linguistica aplicada,0213-2028,2254-6774,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +revista espanola de linguistica aplicada,0213-2028,2254-6774,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +revista espanola de medicina nuclear e imagen molecular,2253-654X,2253-8070,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER ESPANA SLU,NA +revista espanola de pedagogia,0034-9461,2174-0909,REPedagogia,0,1,0,1,NA,Education & Educational Research,NA,UNIV INT RIOJA-UNIR,2016-02-12 +revista espanola de quimioterapia,0214-3429,1988-9518,NA,0,0,1,0,Microbiology | Pharmacology & Pharmacy,NA,NA,SOCIEDAD ESPANOLA QUIMIOTERAPIA,NA +revista espanola de salud publica,1135-5727,2173-9110,RESaludPublica,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,MINISTERIO DE SANIDAD Y CONSUMO,2019-09-05 +revista fitotecnia mexicana,0187-7380,NA,NA,0,0,1,0,Agronomy,NA,NA,SOC MEXICANA FITOGENETICA,NA +revista iberoamericana,0034-9631,2154-4794,NA,1,0,0,0,NA,NA,"Literature, Romance","UNIV PITTSBURGH, UNIV LIBRARY SYSTEM",NA +revista iberoamericana de automatica e informatica industrial,1697-7912,1697-7920,NA,0,0,1,0,Automation & Control Systems | Robotics,NA,NA,COMITE ESPANOL AUTOMATICA CEA,NA +revista iberoamericana de diagnostico y evaluacion-e avaliacao psicologica,2183-6051,2183-6051,NA,0,1,0,0,NA,"Psychology, Clinical",NA,AIDEP,NA +revista iberoamericana de micologia,1130-1406,2173-9188,NA,0,0,1,0,Mycology,NA,NA,ASOCIACION ESPANOLA MICOLOGIA-AEM,NA +revista internacional de andrologia,1698-031X,1698-0409,NA,0,0,1,0,Andrology,NA,NA,ELSEVIER ESPANA SLU,NA +revista internacional de contaminacion ambiental,0188-4999,NA,NA,0,0,1,0,Environmental Sciences,NA,NA,CENTRO CIENCIAS ATMOSFERA UNAM,NA +revista internacional de medicina y ciencias de la actividad fisica y del deporte,1577-0354,1577-0354,NA,0,0,1,0,Sport Sciences,NA,NA,RED IRIS,NA +revista internacional de metodos numericos para calculo y diseno en ingenieria,0213-1315,1886-158X,NA,0,0,1,0,"Engineering, Multidisciplinary | Mathematics, Interdisciplinary Applications",NA,NA,SCIPEDIA S L,NA +revista internacional de sociologia,0034-9712,1988-429X,NA,0,1,0,0,NA,Sociology,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +revista latino-americana de enfermagem,1518-8345,1518-8345,rlae_eerp,0,1,1,1,Nursing,Nursing,NA,"UNIV SAO PAULO, ESCOLA DE ENFERMAGEM DE RIBEIRAO PRETO",2011-05-05 +revista latino-americana de enfermagem,1518-8345,1518-8345,rlae_eerp,0,1,1,1,Nursing,Nursing,NA,"UNIV SAO PAULO, ESCOLA DE ENFERMAGEM DE RIBEIRAO PRETO",2011-05-05 +revista latinoamericana de investigacion en matematica educativa-relime,1665-2436,2007-6819,NA,0,1,0,0,NA,Education & Educational Research,NA,CLAME-COMITE LATINOAMERICANO MAT EDUC,NA +revista latinoamericana de psicologia,0120-0534,NA,revistarlp,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,FOUNDATION ADVANCEMENT PSYCHOLOGY,2018-04-13 +revista matematica complutense,1139-1138,1988-2807,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +revista matematica iberoamericana,0213-2230,NA,NA,0,0,1,0,Mathematics,NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +revista medica de chile,0034-9887,0717-6163,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SOC MEDICA SANTIAGO,NA +revista mexicana de astronomia y astrofisica,0185-1101,NA,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,"UNIV NACIONAL AUTONOMA MEXICO, INST DE ASTRONOMIA",NA +revista mexicana de biodiversidad,1870-3453,2007-8706,NA,0,0,1,0,Biodiversity Conservation,NA,NA,"INST BIOLOGIA, UNIV NACIONAL AUTONOMA MEXICO",NA +revista mexicana de ciencias geologicas,1026-8774,2007-2902,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,CENTRO GEOCIENCIAS UNAM,NA +revista mexicana de ciencias pecuarias,2007-1124,2448-6698,revistapecuaria,0,0,1,1,"Agriculture, Dairy & Animal Science",NA,NA,INIFAP-CENID PARASITOLOGIA VETERINARIA,2021-11-17 +revista mexicana de fisica,0035-001X,0035-001X,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SOC MEXICANA FISICA,NA +revista mexicana de ingenieria quimica,1665-2738,2395-8472,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical",NA,NA,UNIV AUTONOMA METROPOLITANA-IZTAPALAPA,NA +revista mexicana de psicologia,0185-6073,NA,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SOC MEXICANA PSICOLOGIA,NA +revista musical chilena,0716-2790,0717-6252,NA,1,0,0,0,NA,NA,Music,"UNIV CHILE, FACULTY ARTS",NA +revista mvz cordoba,0122-0268,1909-0544,revmvz,0,0,1,1,"Agriculture, Dairy & Animal Science",NA,NA,UNIV CORDOBA,2014-03-21 +revista panamericana de salud publica-pan american journal of public health,1020-4989,1680-5348,rpsp_pajph,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,PAN AMER HEALTH ORGANIZATION,2010-10-18 +revista portuguesa de cardiologia,0870-2551,0304-4750,rpcardiologia,0,0,1,1,Cardiac & Cardiovascular System,NA,NA,ELSEVIER ESPANA SLU,2020-01-03 +revista romana de materiale-romanian journal of materials,1583-3186,NA,NA,0,0,1,0,"Construction & Building Technology | Materials Science, Multidisciplinary",NA,NA,SERBAN SOLACOLU FOUNDATION,NA +revista romana de medicina de laborator,1841-6624,2284-5623,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,SCIENDO,NA +revista signos,0718-0934,0718-0934,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,EDICIONES UNIV VALPARAISO,NA +revista signos,0718-0934,0718-0934,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,EDICIONES UNIV VALPARAISO,NA +revolutionary russia,0954-6545,1743-7873,russia_journal,1,0,0,1,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-02-19 +revstat-statistical journal,1645-6726,2183-0371,NA,0,0,1,0,Statistics & Probability,NA,NA,INST NACIONAL ESTATISTICA-INE,NA +revue belge de philologie et d histoire,0035-0818,NA,NA,1,0,0,0,NA,NA,History | Literature | Language & Linguistics,REVUE BELGE PHILOLOGIE HISTOIRE,NA +revue biblique,0035-0907,2466-8583,NA,1,0,0,0,NA,NA,Religion,PEETERS,NA +revue d ecologie-la terre et la vie,0249-7395,0249-7395,NA,0,0,1,0,Ecology,NA,NA,SOC NATL PROTECTION NATURE ACCLIMATATION FRANCE,NA +revue d economie politique,0373-2630,2105-2883,NA,0,1,0,0,NA,Economics | Political Science,NA,EDITIONS DALLOZ,NA +revue d epidemiologie et de sante publique,0398-7620,1773-0627,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,MASSON EDITEUR,NA +revue d etudes comparatives est-ouest,0338-0599,2259-6100,NA,0,1,0,0,NA,Economics,NA,PRESSES UNIV FRANCE,NA +revue d histoire de l amerique francaise,0035-2357,NA,NA,1,0,0,0,NA,NA,History,INST HIST DEL L AMER FR,NA +revue d histoire des mathematiques,1262-022X,1262-022X,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SOC MATHEMATIQUE FRANCE,NA +revue d histoire des mathematiques,1262-022X,1262-022X,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science,SOC MATHEMATIQUE FRANCE,NA +revue d histoire du theatre,1291-2530,NA,NA,1,0,0,0,NA,NA,Theater,SOC HISTOIRE THEATRE,NA +revue d histoire ecclesiastique,0035-2381,2294-1088,RHE_Revue,1,0,0,1,NA,NA,History | Religion,CULTURA,2020-10-08 +revue d histoire litteraire de la france,0035-2411,2105-2689,NA,1,0,0,0,NA,NA,"Literature, Romance",CLASSIQUES GARNIER,NA +revue d histoire moderne et contemporaine,0048-8003,1776-3045,revuehmc,1,0,0,1,NA,NA,History,SOC HISTOIRE MODERNE CONTEMPORAINE,2018-09-17 +revue de geographie alpine-journal of alpine research,0035-1121,1760-7426,NA,0,1,0,0,NA,Geography,NA,IGA-ASSOC DIFFUSION RECHERCHE ALPINE,NA +revue de l art,0035-1326,1953-812X,NA,1,0,0,0,NA,NA,Art,EDITIONS C N R S,NA +revue de l histoire des religions,0035-1423,2105-2573,NA,1,0,0,0,NA,NA,Religion | History,ARMAND COLIN,NA +revue de linguistique romane,0035-1458,NA,NA,1,0,0,0,NA,NA,Language & Linguistics,SOC LINGUISTIQUE ROMANE,NA +revue de medecine interne,0248-8663,1768-3122,RevMedInterne,0,0,1,1,"Medicine, General & Internal",NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,2014-09-11 +revue de medecine veterinaire,0035-1555,2258-0646,NA,0,0,1,0,Veterinary Sciences,NA,NA,ECOLE NATIONALE VETERINAIRE TOULOUSE,NA +revue de metaphysique et de morale,0035-1571,2102-5177,NA,1,0,0,0,NA,NA,Philosophy,PRESSES UNIV FRANCE,NA +revue de musicologie,0035-1601,NA,NA,1,0,0,0,NA,NA,Music,EDITIONS TRANSATLANTIQUES,NA +revue de synthese,0035-1776,1955-2343,NA,1,0,0,0,NA,NA,History | Literary Theory & Criticism | Philosophy,BRILL,NA +revue des etudes italiennes,0035-2047,NA,NA,1,0,0,0,NA,NA,"Literature, Romance",EDITIONS L'AGE D'HOMME,NA +revue des etudes juives,0484-8616,1783-175X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",PEETERS,NA +revue des langues romanes,0223-3711,2391-114X,NA,1,0,0,0,NA,NA,"Literature, Romance | Language & Linguistics",REVUE DES LANGUES ROMANES,NA +revue des maladies respiratoires,0761-8425,1776-2588,NA,0,0,1,0,Respiratory System,NA,NA,MASSON EDITEUR,NA +revue des musees de france-revue du louvre,1962-4271,NA,NA,1,0,0,0,NA,NA,Art,CONSEIL MUSEES NATIONAUX,NA +revue des sciences philosophiques et theologiques,0035-2209,2118-4445,NA,1,0,0,0,NA,NA,Philosophy | Religion,"LIBRAIRIE PHILOS, J VRIN",NA +revue du nord,0035-2624,2271-7005,RevueDuNord,1,0,0,1,NA,NA,History,UNIV CHARLES DE GAULLE -LILLE III,2016-04-04 +revue francaise d allergologie,1877-0320,1877-0320,RFAllergo,0,0,1,1,Allergy,NA,NA,"ELSEVIER MASSON, CORPORATION OFFICE",2018-11-03 +revue francaise d etudes americaines,0397-7870,1776-3061,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",ASSOC FRANCAISE ETUDES AMER,NA +revue francaise de linguistique appliquee,1386-1204,1875-368X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,PUBLICATIONS LINGUISTIQUES,NA +revue francaise de linguistique appliquee,1386-1204,1875-368X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,PUBLICATIONS LINGUISTIQUES,NA +revue francaise de sociologie,0035-2969,1958-5691,rfs_revue,0,1,0,1,NA,Sociology,NA,PRESSES SCIENCES PO,2016-05-26 +revue historique,0035-3264,2104-3825,NA,1,0,0,0,NA,NA,History,PRESSES UNIV FRANCE,NA +revue internationale de philosophie,0048-8143,2033-0138,NA,1,0,0,0,NA,NA,Philosophy,REVUE INT PHILOSOPHIE,NA +revue neurologique,0035-3787,2213-0004,NA,0,0,1,0,Clinical Neurology,NA,NA,MASSON EDITEUR,NA +revue philosophique de la france et de l etranger,0035-3833,2104-385X,NA,1,0,0,0,NA,NA,Philosophy,PRESSES UNIV FRANCE,NA +revue philosophique de louvain,0035-3841,1783-1768,NA,1,0,0,0,NA,NA,Philosophy,PEETERS,NA +revue romane,0035-3906,1600-0811,NA,1,0,0,0,NA,NA,"Language & Linguistics | Literature, Romance",JOHN BENJAMINS PUBLISHING CO,NA +revue roumaine de chimie,0035-3930,NA,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,EDITURA ACAD ROMANE,NA +revue roumaine de linguistique-romanian review of linguistics,0035-3957,0035-3957,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,EDITURA ACAD ROMANE,NA +revue roumaine de linguistique-romanian review of linguistics,0035-3957,0035-3957,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,EDITURA ACAD ROMANE,NA +revue roumaine de philosophie,1220-5400,NA,NA,1,0,0,0,NA,NA,Philosophy,EDITURA ACAD ROMANE,NA +revue roumaine des sciences techniques-serie electrotechnique et energetique,0035-4066,NA,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,EDITURA ACAD ROMANE,NA +revue scientifique et technique-office international des epizooties,0253-1933,1608-0637,NA,0,0,1,0,Veterinary Sciences,NA,NA,OFFICE INT EPIZOOTIES,NA +revue suisse de zoologie,0035-418X,0035-418X,NA,0,0,1,0,Zoology,NA,NA,MUSEUM HISTOIRE NATURELLE,NA +revue theologique de louvain,0080-2654,1783-8401,NA,1,0,0,0,NA,NA,Religion,PEETERS,NA +rheologica acta,0035-4511,1435-1528,RheologicaActa,0,0,1,1,Mechanics,NA,NA,SPRINGER,2016-07-19 +rhetoric review,0735-0198,1532-7981,Rhetoric_Review,1,0,0,1,NA,NA,Literature | Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-07-08 +rhetoric society quarterly,0277-3945,1930-322X,NA,1,1,0,0,NA,Communication,Philosophy | Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +rhetoric society quarterly,0277-3945,1930-322X,NA,1,1,0,0,NA,Communication,Philosophy | Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +rhetorica-a journal of the history of rhetoric,0734-8584,1533-8541,NA,1,0,0,0,NA,NA,History | Literature,UNIV CALIFORNIA PRESS,NA +rheumatic disease clinics of north america,0889-857X,1558-3163,NA,0,0,1,0,Rheumatology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +rheumatology,1462-0324,1462-0332,NA,0,0,1,0,Rheumatology,NA,NA,OXFORD UNIV PRESS,NA +rheumatology and therapy,2198-6576,2198-6584,RheumatolTher,0,0,1,1,Rheumatology,NA,NA,SPRINGER,2017-05-12 +rheumatology international,0172-8172,1437-160X,NA,0,0,1,0,Rheumatology,NA,NA,SPRINGER HEIDELBERG,NA +rhinology,0300-0729,0300-0729,JRhinology,0,0,1,1,Otorhinolaryngology,NA,NA,INT RHINOLOGIC SOC,2021-11-09 +rhizosphere,2452-2198,2452-2198,NA,0,0,1,0,Plant Sciences | Soil Science,NA,NA,ELSEVIER,NA +rhodora,0035-4902,1938-3401,NA,0,0,1,0,Plant Sciences,NA,NA,NEW ENGLAND BOTANICAL CLUB INC,NA +rice,1939-8425,1939-8433,NA,0,0,1,0,Agronomy,NA,NA,SPRINGER,NA +rice science,1672-6308,1876-4762,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,ELSEVIER,NA +ricerche di matematica,0035-5038,1827-3491,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER-VERLAG ITALIA SRL,NA +ricerche di storia dell arte,0392-7202,NA,NA,1,0,0,0,NA,NA,Art,NUOVA ITALIA SCIENTIFICA SPA,NA +ride-the journal of applied theatre and performance,1356-9783,1470-112X,ride_journal,1,1,0,1,NA,Education & Educational Research,Theater,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-03-31 +ride-the journal of applied theatre and performance,1356-9783,1470-112X,ride_journal,1,1,0,1,NA,Education & Educational Research,Theater,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-03-31 +ried-revista iberoamericana de educacion a distancia,1138-2783,1390-3306,revistaRIED,0,1,0,1,NA,Education & Educational Research,NA,ASOC IBEROAMERICANA EDUCACION SUPERIOR DISTANCIA,2014-04-21 +riha journal,2190-3328,2190-3328,RIHAJournal,1,0,0,1,NA,NA,Art,"RIHA-INT ASSOC RESEARCH, INST HISTORY ART",2014-02-05 +rijksmuseum bulletin,1877-8127,2772-6126,NA,1,0,0,0,NA,NA,Art,RIJKSMUSEUM AMSTERDAM-RIJKSMUSEM PUBLICATIONS,NA +rilce-revista de filologia hispanica,0213-2370,2174-0917,Rilce_RFH,1,1,0,1,NA,Linguistics,"Literature, Romance | Language & Linguistics","UNIV NAVARRA, SERVICIO PUBLICACIONES",2018-10-02 +rilce-revista de filologia hispanica,0213-2370,2174-0917,Rilce_RFH,1,1,0,1,NA,Linguistics,"Literature, Romance | Language & Linguistics",SERVICIO PUBL UNIV NAVARRA,2018-10-02 +rinascimento,0080-3073,2037-6138,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,CASA EDITRICE LEO S OLSCHKI,NA +risk analysis,0272-4332,1539-6924,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Public, Environmental & Occupational Health | Social Sciences, Mathematical Methods",NA,WILEY,NA +risk analysis,0272-4332,1539-6924,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Public, Environmental & Occupational Health | Social Sciences, Mathematical Methods",NA,WILEY,NA +risk management-an international journal,1460-3799,1743-4637,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,PALGRAVE MACMILLAN LTD,NA +risk management and healthcare policy,1179-1594,1179-1594,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,DOVE MEDICAL PRESS LTD,NA +risk management and healthcare policy,1179-1594,1179-1594,NA,0,1,1,0,Health Care Sciences & Services,Health Policy & Services,NA,DOVE MEDICAL PRESS LTD,NA +river research and applications,1535-1459,1535-1467,NA,0,0,1,0,Environmental Sciences | Water Resources,NA,NA,WILEY,NA +rivista del nuovo cimento,0393-697X,1826-9850,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SPRINGERNATURE,NA +rivista di estetica,0035-6212,0035-6212,NA,1,0,0,0,NA,NA,Philosophy,ROSENBERG & SELLIER,NA +rivista di filologia e di istruzione classica,0035-6220,0035-6220,NA,1,0,0,0,NA,NA,Classics,LOESCHER EDITORE,NA +rivista di filosofia neo-scolastica,0035-6247,0035-6247,NA,1,0,0,0,NA,NA,Philosophy,VITA PENSIERO,NA +rivista di letterature moderne e comparate,0391-2108,NA,NA,1,0,0,0,NA,NA,Literature,PACINI EDITORE,NA +rivista di psichiatria,0035-6484,2038-2502,NA,0,1,1,0,Psychiatry,Psychiatry,NA,PENSIERO SCIENTIFICO EDITORE,NA +rivista di psichiatria,0035-6484,2038-2502,NA,0,1,1,0,Psychiatry,Psychiatry,NA,PENSIERO SCIENTIFICO EDITORE,NA +rivista di storia della filosofia,0393-2516,0393-2516,NA,1,0,0,0,NA,NA,Philosophy,FRANCO ANGELI,NA +rivista di storia e letteratura religiosa,0035-6573,2035-7583,NA,1,0,0,0,NA,NA,Religion,CASA EDITRICE LEO S OLSCHKI,NA +rivista italiana delle sostanze grasse,0035-6808,NA,NA,0,0,1,0,Food Science & Technology,NA,NA,INNOVHUB SSI-AREA SSOG,NA +rivista italiana di musicologia,0035-6867,2036-5586,NA,1,0,0,0,NA,NA,Music,ITALIAN SOC MUSICOLOGY,NA +rivista italiana di paleontologia e stratigrafia,0035-6883,2039-4942,NA,0,0,1,0,Geology | Paleontology,NA,NA,UNIV STUDI MILANO,NA +rivista storica dell antichita,0300-340X,NA,NA,1,0,0,0,NA,NA,History | Classics,PATRON EDITORE S R L,NA +rivista storica italiana,0035-7073,NA,NA,1,0,0,0,NA,NA,History,EDIZIONI SCIENTIFICHE ITALIANE,NA +rla-revista de linguistica teorica y aplicada,0718-4883,0718-4883,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"UNIV CONCEPCION, FAC HUMANIDADES ARTE",NA +rla-revista de linguistica teorica y aplicada,0718-4883,0718-4883,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"UNIV CONCEPCION, FAC HUMANIDADES ARTE",NA +rlc-revue de litterature comparee,0035-1466,0035-1466,NA,1,0,0,0,NA,NA,Literature,DIDIER-ERUDITION,NA +rmd open,2056-5933,2056-5933,NA,0,0,1,0,Rheumatology,NA,NA,BMJ PUBLISHING GROUP,NA +rna,1355-8382,1469-9001,RNAJournal,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,"COLD SPRING HARBOR LAB PRESS, PUBLICATIONS DEPT",2011-11-07 +rna biology,1547-6286,1555-8584,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,TAYLOR & FRANCIS INC,NA +road materials and pavement design,1468-0629,2164-7402,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +robotica,0263-5747,1469-8668,NA,0,0,1,0,Robotics,NA,NA,CAMBRIDGE UNIV PRESS,NA +robotics and autonomous systems,0921-8890,1872-793X,NA,0,0,1,0,"Automation & Control Systems | Computer Science, Artificial Intelligence | Robotics",NA,NA,ELSEVIER,NA +robotics and computer-integrated manufacturing,0736-5845,1879-2537,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Manufacturing | Robotics",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +rock art research,0813-0426,0813-0426,NA,1,0,0,0,NA,NA,Art | Archaeology,ARCHAEOLOGICAL PUBL,NA +rock mechanics and rock engineering,0723-2632,1434-453X,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,SPRINGER WIEN,NA +rocky mountain journal of mathematics,0035-7596,1945-3795,NA,0,0,1,0,Mathematics,NA,NA,ROCKY MT MATH CONSORTIUM,NA +rocznik ochrona srodowiska,1506-218X,NA,NA,0,0,1,0,Environmental Sciences,NA,NA,MIDDLE POMERANIAN SCI SOC ENV PROT,NA +rofo-fortschritte auf dem gebiet der rontgenstrahlen und der bildgebenden verfahren,1438-9029,1438-9010,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,GEORG THIEME VERLAG KG,NA +romance notes,0035-7995,2165-7599,NA,1,0,0,0,NA,NA,"Literature, Romance",UNIV NORTH CAROLINA,NA +romance philology,0035-8002,2295-9017,NA,1,0,0,0,NA,NA,"Language & Linguistics | Literature, Romance",BREPOLS PUBL,NA +romance quarterly,0883-1157,1940-3216,RomQuarterly,1,0,0,1,NA,NA,"Literature, Romance","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-10-21 +romance studies,0263-9904,1745-8153,NA,1,0,0,0,NA,NA,"Literature, Romance","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +romani studies,1528-0748,1757-2274,RomaniStudies,1,1,0,1,NA,Anthropology,"Humanities, Multidisciplinary",LIVERPOOL UNIV PRESS,2020-09-23 +romani studies,1528-0748,1757-2274,RomaniStudies,1,1,0,1,NA,Anthropology,"Humanities, Multidisciplinary",LIVERPOOL UNIV PRESS,2020-09-23 +romanian agricultural research,1222-4227,NA,NA,0,0,1,0,Agronomy,NA,NA,"NATL AGRICULTURAL RESEARCH & DEVELOPMENT INST",NA +romanian journal of economic forecasting,1582-6163,2537-6071,NA,0,1,0,0,NA,Economics,NA,INST ECONOMIC FORECASTING,NA +romanian journal of information science and technology,1453-8245,1453-8245,NA,0,0,1,0,"Computer Science, Theory & Methods | Instruments & Instrumentation | Physics, Applied",NA,NA,EDITURA ACAD ROMANE,NA +romanian journal of legal medicine,1221-8618,1844-8585,NA,0,0,1,0,"Medicine, Legal",NA,NA,ROMANIAN LEGAL MED SOC,NA +romanian journal of morphology and embryology,1220-0522,2066-8279,NA,0,0,1,0,Developmental Biology,NA,NA,EDITURA ACAD ROMANE,NA +romanian journal of physics,1221-146X,1221-146X,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,EDITURA ACAD ROMANE,NA +romanian journal of political science,1582-456X,1582-456X,NA,0,1,0,0,NA,Political Science,NA,ROMANIAN ACAD SOC,NA +romanian reports in physics,1221-1451,1841-8759,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,EDITURA ACAD ROMANE,NA +romanische forschungen,0035-8126,1864-0737,NA,1,0,0,0,NA,NA,"Literature, Romance",VITTORIO KLOSTERMANN GMBH,NA +romanistische zeitschrift fur literaturgeschichte-cahiers d histoire des litteratures romanes,0343-379X,2509-7474,NA,1,0,0,0,NA,NA,"Literature, Romance",UNIVERSITATSVERLAG C WINTER HEIDELBERG GMBH,NA +romanticism,1354-991X,1750-0192,NA,1,0,0,0,NA,NA,Literature,EDINBURGH UNIV PRESS,NA +romantisme,0048-8593,1957-7958,NA,1,0,0,0,NA,NA,Literature,EDITIONS SEDES,NA +rossiiskaya arkheologiya,0869-6063,0869-6063,NA,1,0,0,0,NA,NA,Archaeology,IZDATELSTVO NAUKA,NA +rossiiskaya istoriya,0869-5687,NA,NA,1,0,0,0,NA,NA,History,"ROSSIISKAYA AKAD NAUK, IZDATELSTVO NAUKA",NA +royal society open science,2054-5703,2054-5703,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,ROYAL SOC,NA +rsc advances,2046-2069,2046-2069,RSCAdvances,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,2013-04-24 +rsc medicinal chemistry,NA,2632-8682,rsc_medchem,0,0,1,1,"Chemistry, Medicinal | Biochemistry & Molecular Biology",NA,NA,ROYAL SOC CHEMISTRY,2009-08-18 +rsf-the russell sage journal of the social sciences,2377-8253,2377-8261,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,RUSSELL SAGE FOUNDATION,NA +rubber chemistry and technology,0035-9475,1943-4804,NA,0,0,1,0,Polymer Science,NA,NA,AMER CHEMICAL SOC INC,NA +rural and remote health,1445-6354,1445-6354,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,COLL MEDICINE & DENTISTRY JAMES COOK UNIV TOWNSVILLE,NA +rural and remote health,1445-6354,1445-6354,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,COLL MEDICINE & DENTISTRY JAMES COOK UNIV TOWNSVILLE,NA +rural history-economy society culture,0956-7933,1474-0656,NA,1,1,0,0,NA,History,History,CAMBRIDGE UNIV PRESS,NA +rural history-economy society culture,0956-7933,1474-0656,NA,1,1,0,0,NA,History,History,CAMBRIDGE UNIV PRESS,NA +rural sociology,0036-0112,1549-0831,ruralsociology,0,1,0,1,NA,Sociology,NA,WILEY,2011-07-01 +russell-the journal of the bertrand russell studies,0036-0163,1913-8032,NA,1,0,0,0,NA,NA,Philosophy,BETRAND RUSSELL RESEARCH CENTRE,NA +russian chemical bulletin,1066-5285,1573-9171,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER,NA +russian chemical reviews,0036-021X,1468-4837,RussChemRev,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,TURPION LTD,2020-07-30 +russian geology and geophysics,1068-7971,1878-030X,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,GEOSCIENCEWORLD,NA +russian history-histoire russe,0094-288X,0094-288X,NA,1,0,0,0,NA,NA,History,BRILL,NA +russian journal of applied chemistry,1070-4272,1608-3296,NA,0,0,1,0,"Chemistry, Applied",NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of bioorganic chemistry,1068-1620,1608-330X,NA,0,0,1,0,"Biochemistry & Molecular Biology | Chemistry, Organic",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +russian journal of coordination chemistry,1070-3284,1608-3318,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of developmental biology,1062-3604,1608-3326,NA,0,0,1,0,Developmental Biology,NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of ecology,1067-4136,1608-3334,NA,0,0,1,0,Ecology,NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of electrochemistry,1023-1935,1608-3342,NA,0,0,1,0,Electrochemistry,NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of general chemistry,1070-3632,1608-3350,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +russian journal of genetics,1022-7954,1608-3369,NA,0,0,1,0,Genetics & Heredity,NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of herpetology,1026-2296,1026-2296,NA,0,0,1,0,Zoology,NA,NA,FOLIUM PUBL CO,NA +russian journal of inorganic chemistry,0036-0236,1531-8613,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +russian journal of marine biology,1063-0740,1608-3377,NA,0,0,1,0,Marine & Freshwater Biology,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +russian journal of mathematical physics,1061-9208,1555-6638,NA,0,0,1,0,"Physics, Mathematical",NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of nematology,0869-6918,NA,NA,0,0,1,0,Zoology,NA,NA,"RUSSIAN ACAD SCI, INST PARASITOLOGY",NA +russian journal of non-ferrous metals,1067-8212,1934-970X,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of nondestructive testing,1061-8309,1608-3385,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of numerical analysis and mathematical modelling,0927-6467,1569-3988,NA,0,0,1,0,"Mathematics, Applied",NA,NA,WALTER DE GRUYTER GMBH,NA +russian journal of organic chemistry,1070-4280,1608-3393,NA,0,0,1,0,"Chemistry, Organic",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +russian journal of pacific geology,1819-7140,1819-7159,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of physical chemistry a,0036-0244,1531-863X,NA,0,0,1,0,"Chemistry, Physical",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +russian journal of physical chemistry b,1990-7931,1990-7923,NA,0,0,1,0,"Physics, Atomic, Molecular & Chemical",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +russian journal of plant physiology,1021-4437,1608-3407,NA,0,0,1,0,Plant Sciences,NA,NA,PLEIADES PUBLISHING INC,NA +russian journal of theriology,1682-3559,NA,NA,0,0,1,0,Zoology,NA,NA,"KMK SCIENTIFIC PRESS LTD, MOSCOW STATE UNIV",NA +russian linguistics,0304-3487,1572-8714,NA,1,0,0,0,NA,NA,Language & Linguistics,SPRINGER,NA +russian literature,0304-3479,1878-3678,RussLiterature,1,0,0,1,NA,NA,"Literature, Slavic",ELSEVIER,2016-08-25 +russian mathematical surveys,0036-0279,1468-4829,NA,0,0,1,0,Mathematics,NA,NA,TURPION LTD,NA +russian meteorology and hydrology,1068-3739,1934-8096,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,PLEIADES PUBLISHING INC,NA +russian physics journal,1064-8887,1573-9228,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SPRINGER,NA +russian review,0036-0341,1467-9434,russian_review,1,0,0,1,NA,NA,History,WILEY,2020-08-07 +russian studies in literature,1061-1975,1944-7167,NA,1,0,0,0,NA,NA,"Literature, Slavic","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +russian studies in philosophy,1061-1967,1558-0431,NA,1,0,0,0,NA,NA,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +russkaia literatura,0131-6095,0131-6095,NA,1,0,0,0,NA,NA,"Literature, Slavic","RUSSIAN ACAD SCIENCES, STATE ACAD UNIV HUMANITIES (GAUGN)",NA +rutgers university law review,2374-3859,NA,rutgerslrev,0,1,0,1,NA,Law,NA,RUTGERS UNIV,2011-09-07 +sacred music,0036-2255,0036-2255,NA,1,0,0,0,NA,NA,Music,CHURCH MUSIC ASSOC AMER,NA +sadhana-academy proceedings in engineering sciences,0256-2499,0973-7677,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,SPRINGER INDIA,NA +saeculum,0080-5319,2194-4075,RevistaSaeculum,1,0,0,1,NA,NA,History,BOEHLAU VERLAG GMBH & CIE,2011-08-15 +safety and health at work,2093-7911,2093-7997,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER,NA +safety and health at work,2093-7911,2093-7997,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER,NA +safety science,0925-7535,1879-1042,NA,0,0,1,0,"Engineering, Industrial | Operations Research & Management Science",NA,NA,ELSEVIER,NA +sage open,2158-2440,2158-2440,sageopenjournal,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,2018-11-08 +sahara j-journal of social aspects of hiv-aids,1729-0376,1813-4424,NA,0,1,0,0,NA,"Health Policy & Services | Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,NA +sains malaysiana,0126-6039,2735-0118,SMalaysiana,0,0,1,1,Multidisciplinary Sciences,NA,NA,UNIV KEBANGSAAN MALAYSIA,2020-07-08 +salamandra,0036-3375,NA,NA,0,0,1,0,Zoology,NA,NA,DEUTSCHE GESELLSCHAFT HERPETOLOGIE TERRARIENKUNDE E V,NA +salmagundi-a quarterly of the humanities and social sciences,0036-3529,NA,SalmagundiMag,1,0,0,1,NA,NA,Literary Reviews,SALMAGUNDI,2012-02-16 +salud colectiva,1669-2381,1851-8265,SaludColectiva,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,UNIVERSIDAD NACIONAL DE LANUS,2011-03-30 +salud mental,0185-3325,NA,NA,0,1,0,0,NA,Psychiatry,NA,INST NAC PSIQUIATRIA RAMON FUENTE MUNIZ,NA +salud publica de mexico,0036-3634,1606-7916,SaludPublicaMex,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,INST NACIONAL SALUD PUBLICA,2016-10-03 +samj south african medical journal,0256-9574,2078-5135,SAMJ_online,0,0,1,1,"Medicine, General & Internal",NA,NA,SA MEDICAL ASSOC,2013-04-26 +sampe journal,0091-1062,NA,NA,0,0,1,0,"Engineering, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,SAMPE PUBLISHERS,NA +sante publique,0995-3914,2104-3841,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,SOC FRANCAISE SANTE PUBLIQUE,NA +sao paulo medical journal,1516-3180,1806-9460,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,ASSOCIACAO PAULISTA MEDICINA,NA +sar and qsar in environmental research,1062-936X,1029-046X,NA,0,0,1,0,"Chemistry, Multidisciplinary | Computer Science, Interdisciplinary Applications | Environmental Sciences | Mathematical & Computational Biology | Toxicology",NA,NA,TAYLOR & FRANCIS LTD,NA +sarcoidosis vasculitis and diffuse lung diseases,1124-0490,2532-179X,NA,0,0,1,0,Respiratory System,NA,NA,MATTIOLI 1885,NA +saude e sociedade,0104-1290,1984-0470,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,"UNIV SAO PAULO, FAC SAUDE PUBLICA",NA +saudi journal of biological sciences,1319-562X,2213-7106,NA,0,0,1,0,Biology,NA,NA,ELSEVIER,NA +saudi journal of gastroenterology,1319-3767,1998-4049,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,WOLTERS KLUWER MEDKNOW PUBLICATIONS,NA +saudi medical journal,0379-5284,0379-5284,smj_journal,0,0,1,1,"Medicine, General & Internal",NA,NA,SAUDI MED J,2014-08-11 +saudi pharmaceutical journal,1319-0164,2213-7475,SaudiPharmJ,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ELSEVIER,2021-12-06 +sbornik mathematics,1064-5616,1468-4802,NA,0,0,1,0,Mathematics,NA,NA,TURPION LTD,NA +scandia,0036-5483,NA,NA,1,1,0,0,NA,History,History,SCANDIA,NA +scandia,0036-5483,NA,NA,1,1,0,0,NA,History,History,SCANDIA,NA +scandinavian actuarial journal,0346-1238,1651-2030,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Social Sciences, Mathematical Methods",NA,TAYLOR & FRANCIS LTD,NA +scandinavian actuarial journal,0346-1238,1651-2030,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications | Statistics & Probability","Social Sciences, Mathematical Methods",NA,TAYLOR & FRANCIS LTD,NA +scandinavian cardiovascular journal,1401-7431,1651-2006,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,TAYLOR & FRANCIS LTD,NA +scandinavian journal of caring sciences,0283-9318,1471-6712,NA,0,1,0,0,NA,Nursing,NA,WILEY,NA +scandinavian journal of clinical & laboratory investigation,0036-5513,1502-7686,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,TAYLOR & FRANCIS LTD,NA +scandinavian journal of economics,0347-0520,1467-9442,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +scandinavian journal of educational research,0031-3831,1470-1170,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +scandinavian journal of forest research,0282-7581,1651-1891,NA,0,0,1,0,Forestry,NA,NA,TAYLOR & FRANCIS AS,NA +scandinavian journal of gastroenterology,0036-5521,1502-7708,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,TAYLOR & FRANCIS LTD,NA +scandinavian journal of history,0346-8755,1502-7716,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +scandinavian journal of hospitality and tourism,1502-2250,1502-2269,scandinavianof,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-01-20 +scandinavian journal of immunology,0300-9475,1365-3083,NA,0,0,1,0,Immunology,NA,NA,WILEY,NA +scandinavian journal of laboratory animal science,0901-3393,0901-3393,NA,0,0,1,0,Veterinary Sciences,NA,NA,SCANDINAVIAN FEDERATION LABORATORY ANIMAL SCIENCE,NA +scandinavian journal of management,0956-5221,1873-3387,scamanjournal,0,1,0,1,NA,Management,NA,ELSEVIER SCI LTD,NA +scandinavian journal of medicine & science in sports,0905-7188,1600-0838,NA,0,0,1,0,Sport Sciences,NA,NA,WILEY,NA +scandinavian journal of occupational therapy,1103-8128,1651-2014,NA,0,1,1,0,Rehabilitation,Rehabilitation,NA,TAYLOR & FRANCIS LTD,NA +scandinavian journal of occupational therapy,1103-8128,1651-2014,NA,0,1,1,0,Rehabilitation,Rehabilitation,NA,TAYLOR & FRANCIS LTD,NA +scandinavian journal of primary health care,0281-3432,1502-7724,NA,0,0,1,0,"Health Care Sciences & Services | Primary Health Care | Medicine, General & Internal",NA,NA,TAYLOR & FRANCIS LTD,NA +scandinavian journal of psychology,0036-5564,1467-9450,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,WILEY,NA +scandinavian journal of public health,1403-4948,1651-1905,JournalSjph,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS LTD,2018-05-23 +scandinavian journal of public health,1403-4948,1651-1905,JournalSjph,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS LTD,2018-05-23 +scandinavian journal of rheumatology,0300-9742,1502-7732,NA,0,0,1,0,Rheumatology,NA,NA,TAYLOR & FRANCIS LTD,NA +scandinavian journal of statistics,0303-6898,1467-9469,NA,0,0,1,0,Statistics & Probability,NA,NA,WILEY,NA +scandinavian journal of surgery,1457-4969,1799-7267,ScandJSurg,0,0,1,1,Surgery,NA,NA,SAGE PUBLICATIONS LTD,2017-08-09 +scandinavian journal of the old testament,0901-8328,1502-7244,NA,1,0,0,0,NA,NA,Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +scandinavian journal of trauma resuscitation & emergency medicine,1757-7241,1757-7241,SJTREM,0,0,1,1,Emergency Medicine,NA,NA,BMC,2015-12-16 +scandinavian journal of urology,2168-1805,2168-1813,ScanJourUrol,0,0,1,1,Urology & Nephrology,NA,NA,TAYLOR & FRANCIS LTD,2017-12-29 +scandinavian journal of work environment & health,0355-3140,1795-990X,SJWEH,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SCANDINAVIAN JOURNAL WORK ENVIRONMENT & HEALTH,2013-11-05 +scandinavian journal of work environment & health,0355-3140,1795-990X,SJWEH,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,SCANDINAVIAN JOURNAL WORK ENVIRONMENT & HEALTH,2013-11-05 +scandinavian political studies,0080-6757,1467-9477,scandpolstud,0,1,0,1,NA,Political Science,NA,WILEY,2020-04-29 +scandinavian studies,0036-5637,2163-8195,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",SOC ADVANCEMENT SCAND STUD,NA +scandinavica,0036-5653,0036-5653,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",UNIV EAST ANGLIA,NA +scanning,0161-0457,1932-8745,NA,0,0,1,0,Instruments & Instrumentation | Microscopy,NA,NA,WILEY-HINDAWI,NA +schizophrenia bulletin,0586-7614,1745-1701,SchizBulletin,0,1,1,1,Psychiatry,Psychiatry,NA,OXFORD UNIV PRESS,2019-04-16 +schizophrenia bulletin,0586-7614,1745-1701,SchizBulletin,0,1,1,1,Psychiatry,Psychiatry,NA,OXFORD UNIV PRESS,2019-04-16 +schizophrenia research,0920-9964,1573-2509,SchizRes,0,1,1,1,Psychiatry,Psychiatry,NA,ELSEVIER,2017-03-16 +schizophrenia research,0920-9964,1573-2509,SchizRes,0,1,1,1,Psychiatry,Psychiatry,NA,ELSEVIER,2017-03-16 +schmerz,0932-433X,1432-2129,NA,0,0,1,0,Anesthesiology | Clinical Neurology,NA,NA,SPRINGER HEIDELBERG,NA +school effectiveness and school improvement,0924-3453,1744-5124,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +school mental health,1866-2625,1866-2633,NA,0,1,0,0,NA,"Psychology, Educational | Psychology, Development",NA,SPRINGER,NA +school psychology,2578-4218,2578-4226,NA,0,1,0,0,NA,"Psychology, Educational",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +school psychology international,0143-0343,1461-7374,NA,0,1,0,0,NA,"Psychology, Educational",NA,SAGE PUBLICATIONS LTD,NA +school psychology quarterly,1045-3830,1939-1560,NA,0,1,0,0,NA,"Psychology, Educational",NA,AMER PSYCHOLOGICAL ASSOC,NA +school psychology review,0279-6015,2372-966X,SchoolPsycRev,0,1,0,1,NA,"Psychology, Educational",NA,TAYLOR & FRANCIS INC,2020-04-20 +schweizer archiv fur tierheilkunde,0036-7281,1664-2848,NA,0,0,1,0,Veterinary Sciences,NA,NA,GESELLSCHAFT SCHWEIZER TIERARZTINNEN & TIERARZTE,NA +schweizerisches archiv fur volkskunde,0036-794X,NA,NA,1,0,0,0,NA,NA,Folklore,G KREBS VERLAGSBUCHHANDLUNG AG,NA +science,0036-8075,1095-9203,ScienceMagazine,0,0,1,1,Multidisciplinary Sciences,NA,NA,AMER ASSOC ADVANCEMENT SCIENCE,2009-04-17 +science-fiction studies,0091-7729,NA,NA,1,0,0,0,NA,NA,Literature,SCIENCE-FICTION STUDIES,NA +science & education,0926-7220,1573-1901,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science | Education & Educational Research,History & Philosophy Of Science,SPRINGER,NA +science & education,0926-7220,1573-1901,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science | Education & Educational Research,History & Philosophy Of Science,SPRINGER,NA +science & education,0926-7220,1573-1901,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science | Education & Educational Research,History & Philosophy Of Science,SPRINGER,NA +science & justice,1355-0306,1876-4452,Science_Justice,0,0,1,1,"Medicine, Legal | Pathology",NA,NA,ELSEVIER SCI LTD,2018-04-03 +science & society,0036-8237,1943-2801,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,GUILFORD PUBLICATIONS INC,NA +science & sports,0765-1597,0765-1597,NA,0,0,1,0,Sport Sciences,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +science advances,2375-2548,2375-2548,ScienceAdvances,0,0,1,1,Multidisciplinary Sciences,NA,NA,AMER ASSOC ADVANCEMENT SCIENCE,2014-02-03 +science and engineering ethics,1353-3452,1471-5546,NA,0,1,1,0,"Engineering, Multidisciplinary | History & Philosophy Of Science | Multidisciplinary Sciences",Ethics,NA,SPRINGER,NA +science and engineering ethics,1353-3452,1471-5546,NA,0,1,1,0,"Engineering, Multidisciplinary | History & Philosophy Of Science | Multidisciplinary Sciences",Ethics,NA,SPRINGER,NA +science and engineering of composite materials,0792-1233,2191-0359,NA,0,0,1,0,"Materials Science, Composites",NA,NA,WALTER DE GRUYTER GMBH,NA +science and medicine in football,2473-3938,2473-4446,NA,0,0,1,0,Sport Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +science and public policy,0302-3427,1471-5430,NA,0,1,0,0,NA,Environmental Studies | Management | Public Administration,NA,OXFORD UNIV PRESS,NA +science and technology for the built environment,2374-4731,2374-474X,EditorStbe,0,0,1,1,"Thermodynamics | Construction & Building Technology | Engineering, Mechanical",NA,NA,TAYLOR & FRANCIS INC,2018-08-23 +science and technology of advanced materials,1468-6996,1878-5514,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +science and technology of energetic materials,1347-9466,NA,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Engineering, Chemical | Materials Science, Multidisciplinary",NA,NA,JAPAN EXPLOSIVES SOC,NA +science and technology of nuclear installations,1687-6075,1687-6083,NA,0,0,1,0,Nuclear Science & Technology,NA,NA,HINDAWI LTD,NA +science and technology of welding and joining,1362-1718,1743-2936,NA,0,0,1,0,"Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,TAYLOR & FRANCIS LTD,NA +science and technology studies,2243-4690,2243-4690,STS_Journal,0,1,0,1,NA,History & Philosophy Of Science,NA,FINNISH SOC SCIENCE & TECHNOLOGY STUDIES,2017-12-05 +science as culture,0950-5431,1470-1189,SciAsCulture,1,1,0,1,NA,Cultural Studies | History & Philosophy Of Science,History & Philosophy Of Science | Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-09-08 +science as culture,0950-5431,1470-1189,SciAsCulture,1,1,0,1,NA,Cultural Studies | History & Philosophy Of Science,History & Philosophy Of Science | Cultural Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-09-08 +science bulletin,2095-9273,2095-9281,BulletinScience,0,0,1,1,Multidisciplinary Sciences,NA,NA,ELSEVIER,2015-07-03 +science china-chemistry,1674-7291,1869-1870,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SCIENCE PRESS,NA +science china-earth sciences,1674-7313,1869-1897,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SCIENCE PRESS,NA +science china-information sciences,1674-733X,1869-1919,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic",NA,NA,SCIENCE PRESS,NA +science china-life sciences,1674-7305,1869-1889,NA,0,0,1,0,Biology,NA,NA,SCIENCE PRESS,NA +science china-materials,2095-8226,2199-4501,SciChinaMater,0,0,1,1,"Materials Science, Multidisciplinary",NA,NA,SCIENCE PRESS,2018-07-20 +science china-mathematics,1674-7283,1869-1862,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SCIENCE PRESS,NA +science china-physics mechanics & astronomy,1674-7348,1869-1927,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,SCIENCE PRESS,NA +science china-technological sciences,1674-7321,1869-1900,NA,0,0,1,0,"Engineering, Multidisciplinary | Materials Science, Multidisciplinary",NA,NA,SCIENCE PRESS,NA +science communication,1075-5470,1552-8545,NA,0,1,0,0,NA,Communication,NA,SAGE PUBLICATIONS INC,NA +science education,0036-8326,1098-237X,NA,0,1,0,0,NA,Education & Educational Research,NA,WILEY,NA +science immunology,2470-9468,2470-9468,SciImmunology,0,0,1,1,Immunology,NA,NA,AMER ASSOC ADVANCEMENT SCIENCE,2015-10-20 +science in context,0269-8897,1474-0664,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,CAMBRIDGE UNIV PRESS,NA +science in context,0269-8897,1474-0664,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,CAMBRIDGE UNIV PRESS,NA +science in context,0269-8897,1474-0664,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,CAMBRIDGE UNIV PRESS,NA +science of advanced materials,1947-2935,1947-2943,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,AMER SCIENTIFIC PUBLISHERS,NA +science of computer programming,0167-6423,1872-7964,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,ELSEVIER,NA +science of diabetes self-management and care,2635-0106,2635-0114,NA,0,1,1,0,Endocrinology & Metabolism,"Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +science of diabetes self-management and care,2635-0106,2635-0114,NA,0,1,1,0,Endocrinology & Metabolism,"Public, Environmental & Occupational Health",NA,SAGE PUBLICATIONS INC,NA +science of nature,0028-1042,1432-1904,SoN_NAWI,0,0,1,1,Multidisciplinary Sciences,NA,NA,SPRINGER HEIDELBERG,2020-07-12 +science of sintering,0350-820X,1820-7413,NA,0,0,1,0,"Materials Science, Ceramics | Metallurgy & Metallurgical Engineering",NA,NA,INT INST SCIENCE SINTERING (I I S S),NA +science of the total environment,0048-9697,1879-1026,STOTEN_journal,0,0,1,1,Environmental Sciences,NA,NA,ELSEVIER,2018-05-18 +science progress,0036-8504,2047-7163,SciProgress,0,0,1,1,Multidisciplinary Sciences,NA,NA,SAGE PUBLICATIONS LTD,2013-02-11 +science robotics,2470-9476,2470-9476,SciRobotics,0,0,1,1,Robotics,NA,NA,AMER ASSOC ADVANCEMENT SCIENCE,2015-10-20 +science signaling,1945-0877,1937-9145,scisignal,0,0,1,1,Biochemistry & Molecular Biology | Cell Biology,NA,NA,AMER ASSOC ADVANCEMENT SCIENCE,2010-04-27 +science technology & human values,0162-2439,1552-8251,STHV_journal,0,1,0,1,NA,Social Issues,NA,SAGE PUBLICATIONS INC,2021-11-30 +science technology and society,0971-7218,0973-0796,NA,0,1,0,0,NA,Management,NA,SAGE PUBLICATIONS INDIA PVT LTD,NA +science translational medicine,1946-6234,1946-6242,ScienceTM,0,0,1,1,"Cell Biology | Medicine, Research & Experimental",NA,NA,AMER ASSOC ADVANCEMENT SCIENCE,2011-02-07 +scienceasia,1513-1874,NA,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,SCIENCE SOCIETY THAILAND,NA +sciences sociales et sante,0294-0337,1777-5914,NA,0,1,0,0,NA,"Health Policy & Services | Social Sciences, Interdisciplinary",NA,JOHN LIBBEY EUROTEXT LTD,NA +scientia agricola,1678-992X,1678-992X,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,UNIV SAO PAOLO,NA +scientia forestalis,1413-9324,1413-9324,NA,0,0,1,0,Forestry,NA,NA,IPEF-INST PESQUISAS ESTUDOS FLORESTAIS,NA +scientia horticulturae,0304-4238,1879-1018,NA,0,0,1,0,Horticulture,NA,NA,ELSEVIER,NA +scientia iranica,1026-3098,2345-3605,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,SHARIF UNIV TECHNOLOGY,NA +scientia marina,0214-8358,1886-8134,ScientiaMarina,0,0,1,1,Marine & Freshwater Biology,NA,NA,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,2016-02-26 +scientific american,0036-8733,1946-7087,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,SPRINGER,NA +scientific data,2052-4463,2052-4463,ScientificData,0,0,1,1,Multidisciplinary Sciences,NA,NA,"NATURE PORTFOLIO",2013-03-27 +scientific programming,1058-9244,1875-919X,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,HINDAWI LTD,NA +scientific reports,2045-2322,2045-2322,SciReports,0,0,1,1,Multidisciplinary Sciences,NA,NA,"NATURE PORTFOLIO",2011-03-04 +scientific studies of reading,1088-8438,1532-799X,SSRJournal,0,1,0,1,NA,"Education & Educational Research | Psychology, Educational",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-02-25 +scientist,0890-3670,1547-0806,NA,0,1,1,0,Multidisciplinary Sciences,Information Science & Library Science,NA,LABX MEDIA GROUP,NA +scientist,0890-3670,1547-0806,NA,0,1,1,0,Multidisciplinary Sciences,Information Science & Library Science,NA,LABX MEDIA GROUP,NA +scientometrics,0138-9130,1588-2861,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications",Information Science & Library Science,NA,SPRINGER,NA +scientometrics,0138-9130,1588-2861,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications",Information Science & Library Science,NA,SPRINGER,NA +scipost physics,2542-4653,2542-4653,SciPost_Physics,0,0,1,1,"Physics, Multidisciplinary",NA,NA,SCIPOST FOUNDATION,2018-04-23 +scottish geographical journal,1470-2541,1751-665X,NA,0,1,0,0,NA,Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +scottish historical review,0036-9241,1750-0222,scothistreview,1,1,0,1,NA,History,History,EDINBURGH UNIV PRESS,2017-06-20 +scottish historical review,0036-9241,1750-0222,scothistreview,1,1,0,1,NA,History,History,EDINBURGH UNIV PRESS,2017-06-20 +scottish journal of geology,0036-9276,2041-4951,NA,0,0,1,0,Geology,NA,NA,GEOLOGICAL SOC PUBL HOUSE,NA +scottish journal of political economy,0036-9292,1467-9485,sjpeatses,0,1,0,1,NA,Economics | Political Science,NA,WILEY,2016-04-25 +scottish journal of theology,0036-9306,1475-3065,SJTheology_,1,0,0,1,NA,NA,Religion,CAMBRIDGE UNIV PRESS,2013-12-05 +scottish literary review,1756-5634,2050-6678,NA,1,0,0,0,NA,NA,"Literature, British Isles",ASSOC SCOTTISH LIT STUD,NA +scottish medical journal,0036-9330,2045-6441,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SAGE PUBLICATIONS LTD,NA +screen,0036-9543,1460-2474,Screen_Journal,1,0,0,1,NA,NA,"Film, Radio, Television",OXFORD UNIV PRESS,2015-01-29 +scriblerian and the kit-cats,0036-9640,2165-0624,NA,1,0,0,0,NA,NA,"Literature, British Isles",NEW YORK UNIV,NA +scripta materialia,1359-6462,1872-8456,NA,0,0,1,0,"Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +scripta nova-revista electronica de geografia y ciencias sociales,1138-9788,1138-9788,GeocriticaN,0,1,0,1,NA,Geography,NA,"UNIV BARCELONA, DEPT GEOGRAFIA HUMANA",2021-05-10 +scriptorium,0036-9772,2526-8848,NA,1,0,0,0,NA,NA,Literature | Medieval & Renaissance Studies,CULTURA,NA +sculpture journal,1366-2724,1756-9923,SculptureJnl,1,0,0,1,NA,NA,Art,LIVERPOOL UNIV PRESS,2020-10-29 +sculpture review,0747-5284,2632-3494,NA,1,0,0,0,NA,NA,Art,SAGE PUBLICATIONS INC,NA +sea technology,0093-3651,NA,NA,0,0,1,0,"Engineering, Ocean",NA,NA,"COMPASS PUBLICATIONS, INC",NA +second language research,0267-6583,1477-0326,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,SAGE PUBLICATIONS LTD,NA +securities regulation law journal,0097-9554,NA,NA,0,1,0,0,NA,Law,NA,WEST GROUP,NA +security and communication networks,1939-0114,1939-0122,NA,0,0,1,0,"Computer Science, Information Systems | Telecommunications",NA,NA,WILEY-HINDAWI,NA +security dialogue,0967-0106,1460-3640,secdialogue,0,1,0,1,NA,International Relations,NA,SAGE PUBLICATIONS LTD,2011-12-02 +security journal,0955-1662,1743-4645,NA,0,1,0,0,NA,Criminology & Penology,NA,PALGRAVE MACMILLAN LTD,NA +security studies,0963-6412,1556-1852,secstudies_jrnl,0,1,0,1,NA,International Relations,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-04-14 +sederi-yearbook of the spanish and portuguese society for english renaissance studies,1135-7789,1135-7789,SederiYearbook,1,0,0,1,NA,NA,"Medieval & Renaissance Studies | Literature, British Isles",SEDERI,2015-11-28 +sedimentary geology,0037-0738,1879-0968,NA,0,0,1,0,Geology,NA,NA,ELSEVIER,NA +sedimentology,0037-0746,1365-3091,JSedimentology,0,0,1,1,Geology,NA,NA,WILEY,2019-10-07 +seed science and technology,0251-0952,1819-5717,NA,0,0,1,0,Agronomy | Plant Sciences | Horticulture,NA,NA,ISTA-INT SEED TESTING ASSOC,NA +seed science research,0960-2585,1475-2735,SeedSciRes,0,0,1,1,Plant Sciences,NA,NA,CAMBRIDGE UNIV PRESS,2021-11-26 +sefarad,0037-0894,1988-320X,NA,1,0,0,0,NA,NA,Religion,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +seismological research letters,0895-0695,1938-2057,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SEISMOLOGICAL SOC AMER,NA +seizieme siecle,1774-4466,NA,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,LIBRAIRIE DROZ SA,NA +seizure-european journal of epilepsy,1059-1311,1532-2688,SeizureJournal,0,0,1,1,Clinical Neurology | Neurosciences,NA,NA,W B SAUNDERS CO LTD,2013-03-08 +selecta mathematica-new series,1022-1824,1420-9020,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER INT PUBL AG,NA +self and identity,1529-8868,1529-8876,NA,0,1,0,0,NA,"Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +semantic web,1570-0844,2210-4968,SW_Journal,0,0,1,1,"Computer Science, Artificial Intelligence | Computer Science, Information Systems | Computer Science, Theory & Methods",NA,NA,IOS PRESS,2010-05-19 +semiconductor science and technology,0268-1242,1361-6641,NA,0,0,1,0,"Engineering, Electrical & Electronic | Materials Science, Multidisciplinary | Physics, Condensed Matter",NA,NA,IOP PUBLISHING LTD,NA +semiconductors,1063-7826,1090-6479,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,PLEIADES PUBLISHING INC,NA +semiconductors and semimetals,0080-8784,NA,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Condensed Matter",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +semigroup forum,0037-1912,1432-2137,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER,NA +semina-ciencias agrarias,1676-546X,1679-0359,SeminaAgrarias,0,0,1,1,"Agriculture, Multidisciplinary",NA,NA,UNIV ESTADUAL LONDRINA,2019-04-18 +seminar-a journal of germanic studies,0037-1939,1911-026X,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",UNIV TORONTO PRESS INC,NA +seminars in arthritis and rheumatism,0049-0172,1532-866X,seminarthrheum,0,0,1,1,Rheumatology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2020-01-30 +seminars in cancer biology,1044-579X,1096-3650,NA,0,0,1,0,Oncology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +seminars in cell & developmental biology,1084-9521,1096-3634,NA,0,0,1,0,Cell Biology | Developmental Biology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +seminars in diagnostic pathology,0740-2570,1930-1111,NA,0,0,1,0,Medical Laboratory Technology | Pathology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in dialysis,0894-0959,1525-139X,SemInDial,0,0,1,1,Urology & Nephrology,NA,NA,WILEY,2017-07-05 +seminars in fetal & neonatal medicine,1744-165X,1878-0946,NA,0,0,1,0,Pediatrics,NA,NA,ELSEVIER SCI LTD,NA +seminars in hematology,0037-1963,1532-8686,NA,0,0,1,0,Hematology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in immunology,1044-5323,1096-3618,Official_SSIM,0,0,1,1,Immunology,NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,2021-10-01 +seminars in immunopathology,1863-2297,1863-2300,NA,0,0,1,0,Immunology | Pathology,NA,NA,SPRINGER HEIDELBERG,NA +seminars in interventional radiology,0739-9529,1098-8963,SemInterventRad,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,THIEME MEDICAL PUBL INC,2021-08-20 +seminars in liver disease,0272-8087,1098-8971,SeminLiverDis,0,0,1,1,Gastroenterology & Hepatology,NA,NA,THIEME MEDICAL PUBL INC,2019-08-13 +seminars in musculoskeletal radiology,1089-7860,1098-898X,SMR_SeminarsMSK,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,THIEME MEDICAL PUBL INC,2018-07-25 +seminars in nephrology,0270-9295,1558-4488,NA,0,0,1,0,Urology & Nephrology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in neurology,0271-8235,1098-9021,NA,0,0,1,0,Clinical Neurology,NA,NA,THIEME MEDICAL PUBL INC,NA +seminars in nuclear medicine,0001-2998,1558-4623,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in oncology,0093-7754,1532-8708,NA,0,0,1,0,Oncology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in oncology nursing,0749-2081,1878-3449,SemOncNurs,0,1,1,1,Oncology | Nursing,Nursing,NA,ELSEVIER SCIENCE INC,2021-01-06 +seminars in oncology nursing,0749-2081,1878-3449,SemOncNurs,0,1,1,1,Oncology | Nursing,Nursing,NA,ELSEVIER SCIENCE INC,2021-01-06 +seminars in ophthalmology,0882-0538,1744-5205,NA,0,0,1,0,Ophthalmology,NA,NA,TAYLOR & FRANCIS INC,NA +seminars in orthodontics,1073-8746,1558-4631,NA,0,0,1,0,"Dentistry, Oral Surgery & Medicine",NA,NA,ELSEVIER INC,NA +seminars in pediatric neurology,1071-9091,1558-0776,NA,0,0,1,0,Clinical Neurology | Pediatrics,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in pediatric surgery,1055-8586,1532-9453,NA,0,0,1,0,Pediatrics | Surgery,NA,NA,ELSEVIER SCIENCE INC,NA +seminars in perinatology,0146-0005,1558-075X,NA,0,0,1,0,Obstetrics & Gynecology | Pediatrics,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in plastic surgery,1535-2188,1536-0067,NA,0,0,1,0,Surgery,NA,NA,THIEME MEDICAL PUBL INC,NA +seminars in radiation oncology,1053-4296,1532-9461,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in reproductive medicine,1526-8004,1526-4564,NA,0,0,1,0,Obstetrics & Gynecology | Reproductive Biology,NA,NA,THIEME MEDICAL PUBL INC,NA +seminars in respiratory and critical care medicine,1069-3424,1098-9048,NA,0,0,1,0,Critical Care Medicine | Respiratory System,NA,NA,THIEME MEDICAL PUBL INC,NA +seminars in roentgenology,0037-198X,1558-4658,SeminarRoentgen,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,W B SAUNDERS CO-ELSEVIER INC,2021-09-29 +seminars in speech and language,0734-0478,1098-9056,NA,0,0,1,0,Audiology & Speech-Language Pathology | Rehabilitation,NA,NA,THIEME MEDICAL PUBL INC,NA +seminars in thoracic and cardiovascular surgery,1043-0679,1532-9488,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER INC,NA +seminars in thrombosis and hemostasis,0094-6176,1098-9064,SemThrombHemost,0,0,1,1,Hematology | Peripheral Vascular Diseases,NA,NA,THIEME MEDICAL PUBL INC,2020-09-11 +seminars in ultrasound ct and mri,0887-2171,1558-5034,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +seminars in vascular surgery,0895-7967,1558-4518,SeminarVascSurg,0,0,1,1,Surgery | Peripheral Vascular Diseases,NA,NA,W B SAUNDERS CO-ELSEVIER INC,2021-12-29 +semiotica,0037-1998,1613-3692,NA,1,1,0,0,NA,"Social Sciences, Interdisciplinary","Humanities, Multidisciplinary",WALTER DE GRUYTER GMBH,NA +semiotica,0037-1998,1613-3692,NA,1,1,0,0,NA,"Social Sciences, Interdisciplinary","Humanities, Multidisciplinary",WALTER DE GRUYTER GMBH,NA +sen-i gakkaishi,0037-9875,1884-2259,NA,0,0,1,0,"Materials Science, Textiles | Polymer Science",NA,NA,SOC FIBER SCIENCE TECHNOLOGY,NA +senses & society,1745-8927,1745-8935,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +sensor review,0260-2288,1758-6828,NA,0,0,1,0,Instruments & Instrumentation,NA,NA,EMERALD GROUP PUBLISHING LTD,NA +sensors,1424-8220,1424-8220,Sensors_MDPI,0,0,1,1,"Chemistry, Analytical | Engineering, Electrical & Electronic | Instruments & Instrumentation",NA,NA,MDPI,2015-09-16 +sensors and actuators a-physical,0924-4247,1873-3069,NA,0,0,1,0,"Engineering, Electrical & Electronic | Instruments & Instrumentation",NA,NA,ELSEVIER SCIENCE SA,NA +sensors and actuators b-chemical,0925-4005,0925-4005,NA,0,0,1,0,"Chemistry, Analytical | Electrochemistry | Instruments & Instrumentation",NA,NA,ELSEVIER SCIENCE SA,NA +sensors and materials,0914-4935,0914-4935,Journal_SandM,0,0,1,1,"Instruments & Instrumentation | Materials Science, Multidisciplinary",NA,NA,"MYU, SCIENTIFIC PUBLISHING DIVISION",2011-08-02 +separation and purification reviews,1542-2119,1542-2127,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Analytical | Engineering, Chemical",NA,NA,TAYLOR & FRANCIS INC,NA +separation and purification technology,1383-5866,1873-3794,SepPurifTech,0,0,1,1,"Engineering, Chemical",NA,NA,ELSEVIER,2021-07-31 +separation science and technology,0149-6395,1520-5754,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,TAYLOR & FRANCIS INC,NA +separations,2297-8739,2297-8739,Sep_MDPI,0,0,1,1,"Chemistry, Analytical",NA,NA,MDPI,2017-11-08 +sequential analysis-design methods and applications,0747-4946,1532-4176,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +serbian astronomical journal,1450-698X,1820-9289,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,ASTRONOMICAL OBSERVATORY BELGRADE,NA +serials review,0098-7913,1879-095X,NA,0,1,0,0,NA,Information Science & Library Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +series-journal of the spanish economic association,1869-4187,1869-4195,NA,0,1,0,0,NA,Economics,NA,SPRINGER HEIDELBERG,NA +service business,1862-8516,1862-8508,NA,0,1,0,0,NA,Business | Management,NA,SPRINGER HEIDELBERG,NA +service industries journal,0264-2069,1743-9507,SIJ_tweets,0,1,0,1,NA,Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-09-04 +service science,2164-3962,2164-3970,NA,0,1,0,0,NA,Business | Management,NA,INFORMS,NA +set-valued and variational analysis,1877-0533,1877-0541,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER,NA +seventeenth century,0268-117X,2050-4616,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +sewanee review,0037-3052,1934-421X,sewaneereview,1,0,0,1,NA,NA,Literary Reviews,JOHNS HOPKINS UNIV PRESS,2016-02-06 +sex education-sexuality society and learning,1468-1811,1472-0825,NA,0,1,0,0,NA,"Education & Educational Research | Public, Environmental & Occupational Health",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +sex roles,0360-0025,1573-2762,SexRoles,0,1,0,1,NA,"Psychology, Development | Psychology, Social | Women'S Studies",NA,SPRINGER/PLENUM PUBLISHERS,2013-09-23 +sexual & reproductive healthcare,1877-5756,1877-5764,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,ELSEVIER IRELAND LTD,NA +sexual abuse-a journal of research and treatment,1079-0632,1573-286X,Sexual_Abuse_J,0,1,0,1,NA,"Psychology, Clinical | Criminology & Penology",NA,SAGE PUBLICATIONS INC,2010-07-02 +sexual and relationship therapy,1468-1994,1468-1749,NA,0,1,0,0,NA,"Psychology, Clinical",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +sexual and reproductive health matters,NA,2641-0397,SRHMJournal,0,1,0,1,NA,"Public, Environmental & Occupational Health",NA,TAYLOR & FRANCIS LTD,2010-11-30 +sexual development,1661-5425,1661-5433,NA,0,0,1,0,Developmental Biology,NA,NA,KARGER,NA +sexual health,1448-5028,1449-8987,NA,0,1,1,0,"Public, Environmental & Occupational Health | Infectious Diseases","Public, Environmental & Occupational Health",NA,CSIRO PUBLISHING,NA +sexual health,1448-5028,1449-8987,NA,0,1,1,0,"Public, Environmental & Occupational Health | Infectious Diseases","Public, Environmental & Occupational Health",NA,CSIRO PUBLISHING,NA +sexual medicine,2050-1161,2050-1161,NA,0,0,1,0,"Medicine, General & Internal | Urology & Nephrology",NA,NA,ELSEVIER SCI LTD,NA +sexual medicine reviews,2050-0513,2050-0521,NA,0,0,1,0,Urology & Nephrology,NA,NA,ELSEVIER,NA +sexualities,1363-4607,1461-7382,sexualities1,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS INC,2015-08-11 +sexuality and disability,0146-1044,1573-6717,NA,0,1,0,0,NA,Rehabilitation,NA,SPRINGER,NA +sexuality research and social policy,1868-9884,1553-6610,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SPRINGER,NA +sexually transmitted diseases,0148-5717,1537-4521,STD_Journal,0,0,1,1,Infectious Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-06-20 +sexually transmitted infections,1368-4973,1472-3263,STI_BMJ,0,0,1,1,Infectious Diseases,NA,NA,BMJ PUBLISHING GROUP,2010-04-16 +shakespeare,1745-0918,1745-0926,NA,1,0,0,0,NA,NA,"Theater | Literature, British Isles","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +shakespeare quarterly,0037-3222,1538-3555,NA,1,0,0,0,NA,NA,"Literature, British Isles | Theater",OXFORD UNIV PRESS INC,NA +shakespeare survey,0080-9152,NA,NA,1,0,0,0,NA,NA,"Literature, British Isles | Theater",CAMBRIDGE UNIV PRESS,NA +shaw-the journal of bernard shaw studies,0741-5842,1529-1480,NA,1,0,0,0,NA,NA,"Theater | Literature, British Isles",PENN STATE UNIV PRESS,NA +shenandoah,0037-3583,NA,NA,1,0,0,0,NA,NA,Literary Reviews,WASHINGTON LEE UNIV,NA +shilap-revista de lepidopterologia,0300-5267,2340-4078,NA,0,0,1,0,Entomology,NA,NA,SOC HISPANO-LUSO-AMER LEPIDOPTEROLOGIA-SHILAP,NA +ships and offshore structures,1744-5302,1754-212X,NA,0,0,1,0,"Engineering, Marine",NA,NA,TAYLOR & FRANCIS LTD,NA +shock,1073-2322,1540-0514,ShockJournal,0,0,1,1,Critical Care Medicine | Hematology | Surgery | Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-06-10 +shock and vibration,1070-9622,1875-9203,NA,0,0,1,0,"Acoustics | Engineering, Mechanical | Mechanics",NA,NA,HINDAWI LTD,NA +shock waves,0938-1287,1432-2153,NA,0,0,1,0,Mechanics,NA,NA,SPRINGER,NA +shofar-an interdisciplinary journal of jewish studies,0882-8539,1534-5165,ShofarJournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",PURDUE UNIV PRESS,2012-05-02 +siam-asa journal on uncertainty quantification,2166-2525,2166-2525,NA,0,0,1,0,"Mathematics, Interdisciplinary Applications | Physics, Mathematical",NA,NA,SIAM PUBLICATIONS,NA +siam journal on applied algebra and geometry,2470-6566,2470-6566,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on applied dynamical systems,1536-0040,1536-0040,NA,0,0,1,0,"Mathematics, Applied | Physics, Mathematical",NA,NA,SIAM PUBLICATIONS,NA +siam journal on applied mathematics,0036-1399,1095-712X,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on computing,0097-5397,1095-7111,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on control and optimization,0363-0129,1095-7138,NA,0,0,1,0,"Automation & Control Systems | Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on discrete mathematics,0895-4801,1095-7146,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on financial mathematics,1945-497X,1945-497X,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Business, Finance | Social Sciences, Mathematical Methods",NA,SIAM PUBLICATIONS,NA +siam journal on financial mathematics,1945-497X,1945-497X,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Business, Finance | Social Sciences, Mathematical Methods",NA,SIAM PUBLICATIONS,NA +siam journal on imaging sciences,1936-4954,1936-4954,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Software Engineering | Mathematics, Applied | Imaging Science & Photographic Technology",NA,NA,SIAM PUBLICATIONS,NA +siam journal on mathematical analysis,0036-1410,1095-7154,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on matrix analysis and applications,0895-4798,1095-7162,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on numerical analysis,0036-1429,1095-7170,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on optimization,1052-6234,1095-7189,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam journal on scientific computing,1064-8275,1095-7197,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siam review,0036-1445,1095-7200,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SIAM PUBLICATIONS,NA +siberian mathematical journal,0037-4466,1573-9260,NA,0,0,1,0,Mathematics,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +sight and sound,0037-4806,NA,SightSoundmag,1,0,0,1,NA,NA,"Film, Radio, Television",BRITISH FILM INST,2009-07-03 +sigmod record,0163-5808,1943-5835,sigmodrecord,0,0,1,1,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,ASSOC COMPUTING MACHINERY,2009-04-23 +sign systems studies,1406-4243,1736-7409,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",TARTU UNIV PRESS,NA +signa-revista de la asociacion espanola de semiotica,1133-3634,2254-9307,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV NACIONAL EDUCACION DISTANCIA,NA +signa vitae,1334-5605,1845-206X,NA,0,0,1,0,Emergency Medicine,NA,NA,MRE PRESS,NA +signal image and video processing,1863-1703,1863-1711,NA,0,0,1,0,"Engineering, Electrical & Electronic | Imaging Science & Photographic Technology",NA,NA,SPRINGER LONDON LTD,NA +signal processing,0165-1684,1872-7557,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,ELSEVIER,NA +signal processing-image communication,0923-5965,1879-2677,NA,0,0,1,0,"Engineering, Electrical & Electronic",NA,NA,ELSEVIER,NA +signal transduction and targeted therapy,2095-9907,2059-3635,NA,0,0,1,0,Biochemistry & Molecular Biology | Cell Biology,NA,NA,SPRINGERNATURE,NA +signs,0097-9740,1545-6943,SignsJournal,0,1,0,1,NA,Women'S Studies,NA,UNIV CHICAGO PRESS,2011-08-29 +signs and society,2326-4489,2326-4497,NA,1,1,0,0,NA,Anthropology | Communication | Linguistics,"Humanities, Multidisciplinary",UNIV CHICAGO PRESS,NA +signs and society,2326-4489,2326-4497,NA,1,1,0,0,NA,Anthropology | Communication | Linguistics,"Humanities, Multidisciplinary",UNIV CHICAGO PRESS,NA +silicon,1876-990X,1876-9918,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Multidisciplinary",NA,NA,SPRINGER,NA +silva fennica,0037-5330,2242-4075,SilvaFennica,0,0,1,1,Forestry,NA,NA,FINNISH SOC FOREST SCIENCE-NATURAL RESOURCES INST FINLAND,2017-10-16 +silvae genetica,0037-5349,2509-8934,NA,0,0,1,0,Forestry | Genetics & Heredity,NA,NA,SCIENDO,NA +simiolus-netherlands quarterly for the history of art,0037-5411,NA,simiolus_nl,1,0,0,1,NA,NA,Art,STICHTING NEDERLANDSE KUNSTHISTORISCHE PUBLICATIES,2022-02-01 +simulation-transactions of the society for modeling and simulation international,0037-5497,1741-3133,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Software Engineering",NA,NA,SAGE PUBLICATIONS LTD,NA +simulation in healthcare-journal of the society for simulation in healthcare,1559-2332,1559-713X,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +simulation modelling practice and theory,1569-190X,1878-1462,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Software Engineering",NA,NA,ELSEVIER,NA +singapore economic review,0217-5908,1793-6837,NA,0,1,0,0,NA,Economics,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +singapore journal of tropical geography,0129-7619,1467-9493,NA,0,1,0,0,NA,Geography,NA,WILEY,NA +singapore medical journal,0037-5675,2737-5935,SingaporeMedJ,0,0,1,1,"Medicine, General & Internal",NA,NA,SINGAPORE MEDICAL ASSOC,2020-08-26 +sinn und form,0037-5756,NA,sinnform,1,0,0,1,NA,NA,Literary Reviews,SINN UND FORM,2014-08-10 +sino-christian studies,1990-2670,2224-6606,NA,1,0,0,0,NA,NA,Religion,CHUNG YUAN CHRISTIAN UNIV,NA +sintagma,0214-9141,2013-6455,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,UNIV LLEIDA,NA +sintagma,0214-9141,2013-6455,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,UNIV LLEIDA,NA +sixteenth century journal,0361-0160,2326-0726,16cjournal,1,0,0,1,NA,NA,History,SIXTEENTH CENTURY JOURNAL PUBL,2010-12-08 +skeletal muscle,2044-5040,2044-5040,NA,0,0,1,0,Cell Biology,NA,NA,BMC,NA +skeletal radiology,0364-2348,1432-2161,SkeletalRadiol,0,0,1,1,"Orthopedics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER,2018-01-19 +skin pharmacology and physiology,1660-5527,1660-5535,NA,0,0,1,0,Dermatology | Pharmacology & Pharmacy,NA,NA,KARGER,NA +skin research and technology,0909-752X,1600-0846,NA,0,0,1,0,Dermatology,NA,NA,WILEY,NA +slas discovery,2472-5552,2472-5560,NA,0,0,1,0,"Biochemical Research Methods | Biotechnology & Applied Microbiology | Chemistry, Analytical",NA,NA,SAGE PUBLICATIONS INC,NA +slas technology,2472-6303,2472-6311,NA,0,0,1,0,"Biochemical Research Methods | Chemistry, Analytical",NA,NA,SAGE PUBLICATIONS INC,NA +slavery & abolition,0144-039X,1743-9523,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +slavic and east european journal,0037-6752,0037-6752,SEEJ_Tweets,1,0,0,1,NA,NA,"Literature, Slavic","OHIO STATE UNIV, DEPT SLAVIC & EAST EUROPEAN LANGUAGES & CULTURE",2017-07-25 +slavic review,0037-6779,2325-7784,slavicreview,1,1,0,1,NA,Area Studies,"Humanities, Multidisciplinary",CAMBRIDGE UNIV PRESS,2011-02-04 +slavic review,0037-6779,2325-7784,slavicreview,1,1,0,1,NA,Area Studies,"Humanities, Multidisciplinary",CAMBRIDGE UNIV PRESS,2011-02-04 +slavonic and east european review,0037-6795,2222-4327,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",MODERN HUMANITIES RESEARCH ASSOCIATION,NA +sleep,0161-8105,1550-9109,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,OXFORD UNIV PRESS INC,NA +sleep and biological rhythms,1446-9235,1479-8425,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,SPRINGER JAPAN KK,NA +sleep and breathing,1520-9512,1522-1709,NA,0,0,1,0,Clinical Neurology | Respiratory System,NA,NA,SPRINGER HEIDELBERG,NA +sleep health,2352-7218,2352-7226,NA,0,0,1,0,Clinical Neurology,NA,NA,ELSEVIER,NA +sleep medicine,1389-9457,1878-5506,NA,0,0,1,0,Clinical Neurology,NA,NA,ELSEVIER,NA +sleep medicine reviews,1087-0792,1532-2955,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,W B SAUNDERS CO LTD,NA +slovenian veterinary research,1580-4003,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,"UNIV LJUBLJANA, VETERINARY FACULTY",NA +slovo,0954-6839,0954-6839,SLOVOJournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary","UNIV COLLEGE LONDON, SCHOOL SLAVONIC & EAST EUROPEAN STUDIES",2010-03-09 +slovo a slovesnost,0037-7031,NA,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CZECH LANG INST CZECH ACAD SCI,NA +slovo a slovesnost,0037-7031,NA,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,CZECH LANG INST CZECH ACAD SCI,NA +small,1613-6810,1613-6829,NA,0,0,1,0,"Chemistry, Multidisciplinary | Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary | Physics, Applied | Physics, Condensed Matter",NA,NA,WILEY-V C H VERLAG GMBH,NA +small-scale forestry,1873-7617,1873-7854,NA,0,0,1,0,Forestry,NA,NA,SPRINGER,NA +small axe,0799-0537,1534-6714,SmallAxeProject,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",DUKE UNIV PRESS,2016-03-07 +small business economics,0921-898X,1573-0913,NA,0,1,0,0,NA,Business | Economics | Management,NA,SPRINGER,NA +small group research,1046-4964,1552-8278,SGRjournal,0,1,0,1,NA,"Psychology, Applied | Management | Psychology, Social",NA,SAGE PUBLICATIONS INC,2022-01-07 +small methods,2366-9608,2366-9608,NA,0,0,1,0,"Chemistry, Physical | Nanoscience & Nanotechnology | Materials Science, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +small ruminant research,0921-4488,1879-0941,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,ELSEVIER,NA +smart materials and structures,0964-1726,1361-665X,NA,0,0,1,0,"Instruments & Instrumentation | Materials Science, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +smart structures and systems,1738-1584,1738-1991,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical | Instruments & Instrumentation",NA,NA,TECHNO-PRESS,NA +sobornost incorporating eastern churches review,0144-8722,NA,NA,1,0,0,0,NA,NA,Religion,ST BASILS HOUSE,NA +social & cultural geography,1464-9365,1470-1197,soccultgeog,0,1,0,1,NA,Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-04-06 +social & legal studies,0964-6639,1461-7390,sls_journal,0,1,0,1,NA,"Criminology & Penology | Law | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,2014-12-19 +social analysis,0155-977X,1558-5727,Soc_Analysis,0,1,0,1,NA,Anthropology,NA,BERGHAHN JOURNALS,2017-07-20 +social and personality psychology compass,1751-9004,1751-9004,NA,0,1,0,0,NA,"Psychology, Social",NA,WILEY,NA +social anthropology,0964-0282,1469-8676,SocialAnthropo1,0,1,0,1,NA,Anthropology,NA,WILEY,2013-04-06 +social behavior and personality,0301-2212,1179-6391,NA,0,1,0,0,NA,"Psychology, Social",NA,SOC PERSONALITY RES INC,NA +social choice and welfare,0176-1714,1432-217X,NA,0,1,0,0,NA,"Economics | Social Sciences, Mathematical Methods",NA,SPRINGER,NA +social cognition,0278-016X,NA,NA,0,1,0,0,NA,"Psychology, Social",NA,GUILFORD PUBLICATIONS INC,NA +social cognitive and affective neuroscience,1749-5016,1749-5024,NA,0,1,1,0,Neurosciences | Psychology,"Psychology, Experimental",NA,OXFORD UNIV PRESS,NA +social cognitive and affective neuroscience,1749-5016,1749-5024,NA,0,1,1,0,Neurosciences | Psychology,"Psychology, Experimental",NA,OXFORD UNIV PRESS,NA +social compass,0037-7686,1461-7404,Social_Compass_,1,1,0,1,NA,Sociology,Religion,SAGE PUBLICATIONS LTD,2021-11-02 +social compass,0037-7686,1461-7404,Social_Compass_,1,1,0,1,NA,Sociology,Religion,SAGE PUBLICATIONS LTD,2021-11-02 +social development,0961-205X,1467-9507,SocDevJournal,0,1,0,1,NA,"Psychology, Development",NA,WILEY,2015-07-20 +social dynamics-a journal of african studies,0253-3952,1940-7874,_SocDynamics,0,1,0,1,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-05-07 +social epistemology,0269-1728,1464-5297,SocEpistemology,1,1,0,1,NA,"History & Philosophy Of Science | Social Sciences, Interdisciplinary",Philosophy | History & Philosophy Of Science,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-01-28 +social epistemology,0269-1728,1464-5297,SocEpistemology,1,1,0,1,NA,"History & Philosophy Of Science | Social Sciences, Interdisciplinary",Philosophy | History & Philosophy Of Science,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-01-28 +social forces,0037-7732,1534-7605,sf_journal,0,1,0,1,NA,Sociology,NA,OXFORD UNIV PRESS INC,2014-08-25 +social history,0307-1022,1470-1200,NA,1,0,0,0,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +social history of medicine,0951-631X,1477-4666,SHMeditor,1,1,1,1,History & Philosophy Of Science,History | History & Philosophy Of Science,History | History & Philosophy Of Science,OXFORD UNIV PRESS,2016-07-13 +social history of medicine,0951-631X,1477-4666,SHMeditor,1,1,1,1,History & Philosophy Of Science,History | History & Philosophy Of Science,History | History & Philosophy Of Science,OXFORD UNIV PRESS,2016-07-13 +social history of medicine,0951-631X,1477-4666,SHMeditor,1,1,1,1,History & Philosophy Of Science,History | History & Philosophy Of Science,History | History & Philosophy Of Science,OXFORD UNIV PRESS,2016-07-13 +social inclusion,2183-2803,2183-2803,CogitatioSI,0,1,0,1,NA,"Social Sciences, Interdisciplinary",NA,COGITATIO PRESS,2014-06-11 +social indicators research,0303-8300,1573-0921,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary | Sociology",NA,SPRINGER,NA +social influence,1553-4510,1553-4529,NA,0,1,0,0,NA,"Psychology, Social",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +social issues and policy review,1751-2395,1751-2409,NA,0,1,0,0,NA,"Social Issues | Psychology, Social",NA,WILEY,NA +social justice research,0885-7466,1573-6725,NA,0,1,0,0,NA,"Psychology, Social | Sociology",NA,SPRINGER,NA +social media + society,2056-3051,2056-3051,socialmedia_soc,0,1,0,1,NA,Communication,NA,SAGE PUBLICATIONS LTD,2015-01-05 +social movement studies,1474-2837,1474-2829,socmovstudies,0,1,0,1,NA,Political Science | Sociology,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-05-16 +social networks,0378-8733,1879-2111,NA,0,1,0,0,NA,Anthropology | Sociology,NA,ELSEVIER,NA +social neuroscience,1747-0919,1747-0927,NA,0,0,1,0,Neurosciences | Psychology,NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +social philosophy & policy,0265-0525,1471-6437,NA,1,1,0,0,NA,"Ethics | Social Sciences, Interdisciplinary",Philosophy,CAMBRIDGE UNIV PRESS,NA +social philosophy & policy,0265-0525,1471-6437,NA,1,1,0,0,NA,"Ethics | Social Sciences, Interdisciplinary",Philosophy,CAMBRIDGE UNIV PRESS,NA +social policy & administration,0144-5596,1467-9515,NA,0,1,0,0,NA,Development Studies | Public Administration | Social Issues | Social Work,NA,WILEY,NA +social policy and society,1474-7464,1475-3073,SPSeditors,0,1,0,1,NA,Social Issues | Social Work,NA,CAMBRIDGE UNIV PRESS,2016-10-04 +social politics,1072-4745,1468-2893,NA,0,1,0,0,NA,Social Issues | Women'S Studies,NA,OXFORD UNIV PRESS,NA +social problems,0037-7791,1533-8533,socprobsjournal,0,1,0,1,NA,Sociology,NA,OXFORD UNIV PRESS INC,2014-05-20 +social psychiatry and psychiatric epidemiology,0933-7954,1433-9285,sppejournal,0,1,1,1,Psychiatry,Psychiatry,NA,SPRINGER HEIDELBERG,2018-05-18 +social psychiatry and psychiatric epidemiology,0933-7954,1433-9285,sppejournal,0,1,1,1,Psychiatry,Psychiatry,NA,SPRINGER HEIDELBERG,2018-05-18 +social psychological and personality science,1948-5506,1948-5514,NA,0,1,0,0,NA,"Psychology, Social",NA,SAGE PUBLICATIONS INC,NA +social psychology,1864-9335,2151-2590,SocPsy_journal,0,1,0,1,NA,"Psychology, Social",NA,HOGREFE PUBLISHING CORP,2017-12-16 +social psychology of education,1381-2890,1573-1928,NA,0,1,0,0,NA,"Psychology, Educational",NA,SPRINGER,NA +social psychology quarterly,0190-2725,1939-8999,SPQuarterly,0,1,0,1,NA,"Psychology, Social",NA,SAGE PUBLICATIONS INC,2014-12-27 +social research,0037-783X,NA,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,NEW SCHOOL UNIV,NA +social science & medicine,0277-9536,1873-5347,socscimed,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,PERGAMON-ELSEVIER SCIENCE LTD,2010-01-04 +social science & medicine,0277-9536,1873-5347,socscimed,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Social Sciences, Biomedical",NA,PERGAMON-ELSEVIER SCIENCE LTD,2010-01-04 +social science computer review,0894-4393,1552-8286,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications","Information Science & Library Science | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +social science computer review,0894-4393,1552-8286,NA,0,1,1,0,"Computer Science, Interdisciplinary Applications","Information Science & Library Science | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS INC,NA +social science history,0145-5532,1527-8034,socscihist,1,1,0,1,NA,History | History Of Social Sciences,History,CAMBRIDGE UNIV PRESS,2017-10-08 +social science history,0145-5532,1527-8034,socscihist,1,1,0,1,NA,History | History Of Social Sciences,History,CAMBRIDGE UNIV PRESS,2017-10-08 +social science information sur les sciences sociales,0539-0184,1461-7412,NA,0,1,0,0,NA,"Information Science & Library Science | Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,NA +social science japan journal,1369-1465,1468-2680,ssjj_jrnl,0,1,0,1,NA,"Area Studies | Social Sciences, Interdisciplinary",NA,OXFORD UNIV PRESS,2018-12-18 +social science journal,0362-3319,1873-5355,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +social science quarterly,0038-4941,1540-6237,ssq_online,0,1,0,1,NA,Political Science | Sociology,NA,WILEY,2020-06-05 +social science research,0049-089X,1096-0317,ssreditorial,0,1,0,1,NA,Sociology,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2020-07-16 +social semiotics,1035-0330,1470-1219,NA,1,1,0,0,NA,Communication | Linguistics,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +social semiotics,1035-0330,1470-1219,NA,1,1,0,0,NA,Communication | Linguistics,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +social service review,0037-7961,1537-5404,SocServReview,0,1,0,1,NA,Social Work,NA,UNIV CHICAGO PRESS,2021-07-28 +social studies of science,0306-3127,1460-3659,Soc_Stud_Sci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2012-02-15 +social studies of science,0306-3127,1460-3659,Soc_Stud_Sci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2012-02-15 +social studies of science,0306-3127,1460-3659,Soc_Stud_Sci,1,1,1,1,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,SAGE PUBLICATIONS LTD,2012-02-15 +social theory & health,1477-8211,1477-822X,SocThHlth,0,1,0,1,NA,"Social Sciences, Biomedical",NA,PALGRAVE MACMILLAN LTD,2015-09-19 +social work,0037-8046,1545-6846,NA,0,1,0,0,NA,Social Work,NA,OXFORD UNIV PRESS INC,NA +social work in health care,0098-1389,1541-034X,NA,0,1,0,0,NA,Social Work,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +social work in public health,1937-1918,1937-190X,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Social Work",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +social work research,1070-5309,1545-6838,NA,0,1,0,0,NA,Social Work,NA,OXFORD UNIV PRESS INC,NA +societes,0765-3697,1782-155X,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",DE BOECK UNIV,NA +society,0147-2011,1936-4725,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary | Sociology",NA,SPRINGER,NA +society & animals,1063-1119,1568-5306,NA,0,1,1,0,Veterinary Sciences,Sociology,NA,BRILL,NA +society & animals,1063-1119,1568-5306,NA,0,1,1,0,Veterinary Sciences,Sociology,NA,BRILL,NA +society & natural resources,0894-1920,1521-0723,NA,0,1,0,0,NA,Development Studies | Environmental Studies | Regional & Urban Planning | Sociology,NA,TAYLOR & FRANCIS INC,NA +society and mental health,2156-8693,2156-8731,society_mental,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS INC,2019-10-31 +socio-economic planning sciences,0038-0121,1873-6041,NA,0,1,1,0,Operations Research & Management Science,Economics | Management,NA,ELSEVIER SCIENCE INC,NA +socio-economic planning sciences,0038-0121,1873-6041,NA,0,1,1,0,Operations Research & Management Science,Economics | Management,NA,ELSEVIER SCIENCE INC,NA +socio-economic review,1475-1461,1475-147X,NA,0,1,0,0,NA,Economics | Political Science | Sociology,NA,OXFORD UNIV PRESS,NA +sociobiology,0361-6525,2447-8067,Sociobiology12,0,0,1,1,Entomology,NA,NA,UNIV ESTADUAL FEIRA SANTANA,2021-02-08 +sociologia,0049-1225,1336-8613,NA,0,1,0,0,NA,Sociology,NA,INST SOCIOLOGY SLOVAK ACAD SCIENCES,NA +sociologia ruralis,0038-0199,1467-9523,soruralis,0,1,0,1,NA,Geography | Sociology,NA,WILEY,2017-08-23 +sociological forum,0884-8971,1573-7861,soc_forum,0,1,0,1,NA,Sociology,NA,WILEY,2014-08-02 +sociological inquiry,0038-0245,1475-682X,socioinquiry,0,1,0,1,NA,Sociology,NA,WILEY,2019-01-28 +sociological methodology,0081-1750,1467-9531,socmethod,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS INC,2019-07-09 +sociological methods & research,0049-1241,1552-8294,NA,0,1,0,0,NA,"Social Sciences, Mathematical Methods | Sociology",NA,SAGE PUBLICATIONS INC,NA +sociological perspectives,0731-1214,1533-8673,soc_persp_pdx,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS INC,NA +sociological quarterly,0038-0253,1533-8525,socquarterly,0,1,0,1,NA,Sociology,NA,TAYLOR & FRANCIS INC,2019-11-22 +sociological research online,1360-7804,1360-7804,socresonline,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2012-09-21 +sociological review,0038-0261,1467-954X,thesocreview,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2013-10-02 +sociological science,2330-6696,2330-6696,sociologicalsci,0,1,0,1,NA,Sociology,NA,SOC SOCIOLOGICAL SCIENCE,2013-05-23 +sociological spectrum,0273-2173,1521-0707,NA,0,1,0,0,NA,Sociology,NA,TAYLOR & FRANCIS INC,NA +sociological theory,0735-2751,1467-9558,soctheory,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS INC,2017-08-14 +sociologicky casopis-czech sociological review,0038-0288,2336-128X,NA,0,1,0,0,NA,Sociology,NA,SOCIOLOGICKY CASOPIS,NA +sociologie du travail,0038-0296,1777-5701,sociodutravail,0,1,0,1,NA,Sociology,NA,REVUES ORG,2014-04-01 +sociologisk forskning,0038-0342,0038-0342,sociologiskf,0,1,0,1,NA,Sociology,NA,SOCIOLOGISK FORSKNING,2020-03-15 +sociologus,0038-0377,1865-5106,NA,0,1,0,0,NA,Anthropology | Sociology,NA,DUNCKER & HUMBLOT GMBH,NA +sociology-the journal of the british sociological association,0038-0385,1469-8684,sociologyjnl,0,1,0,1,NA,Sociology,NA,SAGE PUBLICATIONS LTD,2014-07-10 +sociology compass,1751-9020,1751-9020,NA,0,1,0,0,NA,Sociology,NA,WILEY,NA +sociology of education,0038-0407,1939-8573,soceducation,0,1,0,1,NA,Education & Educational Research | Sociology,NA,SAGE PUBLICATIONS INC,2017-09-05 +sociology of health & illness,0141-9889,1467-9566,SHIjournal,0,1,0,1,NA,"Public, Environmental & Occupational Health | Social Sciences, Biomedical | Sociology",NA,WILEY,2013-05-14 +sociology of race and ethnicity,2332-6492,2332-6505,NA,0,1,0,0,NA,Ethnic Studies | Sociology,NA,SAGE PUBLICATIONS INC,NA +sociology of religion,1069-4404,1759-8818,sorjournal,1,1,0,1,NA,Sociology,Religion,OXFORD UNIV PRESS INC,2016-05-13 +sociology of religion,1069-4404,1759-8818,sorjournal,1,1,0,1,NA,Sociology,Religion,OXFORD UNIV PRESS INC,2016-05-13 +sociology of sport journal,0741-1235,1543-2785,SSJ_Journal,0,1,1,1,Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,HUMAN KINETICS PUBL INC,2017-06-23 +sociology of sport journal,0741-1235,1543-2785,SSJ_Journal,0,1,1,1,Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,HUMAN KINETICS PUBL INC,2017-06-23 +soft computing,1432-7643,1433-7479,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications",NA,NA,SPRINGER,NA +soft materials,1539-445X,1539-4468,NA,0,0,1,0,"Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS INC,NA +soft matter,1744-683X,1744-6848,softmatter,0,0,1,1,"Chemistry, Physical | Materials Science, Multidisciplinary | Physics, Multidisciplinary | Polymer Science",NA,NA,ROYAL SOC CHEMISTRY,2009-03-10 +soft robotics,2169-5172,2169-5180,SoftRobotics_JN,0,0,1,1,Robotics,NA,NA,"MARY ANN LIEBERT, INC",2017-01-13 +software-practice & experience,0038-0644,1097-024X,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,WILEY,NA +software and systems modeling,1619-1366,1619-1374,sosym_journal,0,0,1,1,"Computer Science, Software Engineering",NA,NA,SPRINGER HEIDELBERG,2011-05-17 +software quality journal,0963-9314,1573-1367,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,SPRINGER,NA +software testing verification & reliability,0960-0833,1099-1689,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,WILEY,NA +softwarex,2352-7110,2352-7110,SoftXJournal,0,0,1,1,"Computer Science, Software Engineering",NA,NA,ELSEVIER,2014-11-24 +soil,2199-3971,2199-398X,EGU_SOILjournal,0,0,1,1,Soil Science,NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-15 +soil & sediment contamination,1532-0383,1549-7887,NA,0,0,1,0,Environmental Sciences,NA,NA,TAYLOR & FRANCIS INC,NA +soil & tillage research,0167-1987,1879-3444,NA,0,0,1,0,Soil Science,NA,NA,ELSEVIER,NA +soil and water research,1801-5395,1805-9384,NA,0,0,1,0,Soil Science | Water Resources,NA,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +soil biology & biochemistry,0038-0717,1879-3428,SoilBiolBiochem,0,0,1,1,Soil Science,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2020-04-20 +soil dynamics and earthquake engineering,0267-7261,1879-341X,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +soil mechanics and foundation engineering,0038-0741,1573-9279,NA,0,0,1,0,"Engineering, Geological",NA,NA,SPRINGER,NA +soil research,1838-675X,1838-6768,NA,0,0,1,0,Soil Science,NA,NA,CSIRO PUBLISHING,NA +soil science,0038-075X,1538-9243,NA,0,0,1,0,Soil Science,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +soil science and plant nutrition,0038-0768,1747-0765,NA,0,0,1,0,Plant Sciences | Environmental Sciences | Soil Science,NA,NA,TAYLOR & FRANCIS LTD,NA +soil science society of america journal,0361-5995,1435-0661,sssajournal,0,0,1,1,Soil Science,NA,NA,WILEY,2015-01-22 +soil use and management,0266-0032,1475-2743,SUMjournal,0,0,1,1,Soil Science,NA,NA,WILEY,2020-02-05 +soils and foundations,0038-0806,1881-1418,NA,0,0,1,0,"Engineering, Geological | Geosciences, Multidisciplinary",NA,NA,JAPANESE GEOTECHNICAL SOC,NA +sola,1349-6476,1349-6476,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,METEOROLOGICAL SOC JAPAN,NA +solar energy,0038-092X,1471-1257,NA,0,0,1,0,Energy & Fuels,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +solar energy materials and solar cells,0927-0248,1879-3398,NA,0,0,1,0,"Energy & Fuels | Materials Science, Multidisciplinary | Physics, Applied",NA,NA,ELSEVIER,NA +solar physics,0038-0938,1573-093X,solphysjournal,0,0,1,1,Astronomy & Astrophysics,NA,NA,SPRINGER,2019-06-12 +solar rrl,2367-198X,2367-198X,NA,0,0,1,0,"Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,WILEY-V C H VERLAG GMBH,NA +solar system research,0038-0946,1608-3423,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,PLEIADES PUBLISHING INC,NA +soldagem & inspecao,0104-9224,1980-6973,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,ASSOC BRASIL SOLDAGEM,NA +soldering & surface mount technology,0954-0911,1758-6836,NA,0,0,1,0,"Engineering, Manufacturing | Engineering, Electrical & Electronic | Materials Science, Multidisciplinary | Metallurgy & Metallurgical Engineering",NA,NA,EMERALD GROUP PUBLISHING LTD,NA +solid-state electronics,0038-1101,1879-2405,NA,0,0,1,0,"Engineering, Electrical & Electronic | Physics, Applied | Physics, Condensed Matter",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +solid earth,1869-9510,1869-9529,EGU_SEarth,0,0,1,1,Geochemistry & Geophysics,NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-16 +solid fuel chemistry,0361-5219,1934-8029,NA,0,0,1,0,"Chemistry, Multidisciplinary | Energy & Fuels | Engineering, Chemical",NA,NA,PLEIADES PUBLISHING INC,NA +solid state communications,0038-1098,1879-2766,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +solid state ionics,0167-2738,1872-7689,NA,0,0,1,0,"Chemistry, Physical | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +solid state nuclear magnetic resonance,0926-2040,1527-3326,SSNMRjournal,0,0,1,1,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical | Physics, Condensed Matter | Spectroscopy",NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,2019-04-24 +solid state physics,0081-1947,NA,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +solid state sciences,1293-2558,1873-3085,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Physical | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +solvent extraction and ion exchange,0736-6299,1532-2262,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,TAYLOR & FRANCIS INC,NA +solvent extraction research and development-japan,1341-7215,1341-7215,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,JAPAN ASSOC SOLVENT EXTRACTION,NA +somatosensory and motor research,0899-0220,1369-1651,NA,0,0,1,0,Neurosciences,NA,NA,TAYLOR & FRANCIS LTD,NA +sophia,0038-1527,1873-930X,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +sort-statistics and operations research transactions,1696-2281,2013-8830,NA,0,0,1,0,Operations Research & Management Science | Statistics & Probability,NA,NA,INST ESTADISTICA CATALUNYA-IDESCAT,NA +sotsiologicheskie issledovaniya,0132-1625,0132-1625,NA,0,1,0,0,NA,Sociology,NA,IZDATELSTVO NAUKA,NA +souls,1099-9949,1548-3843,JournalSouls,0,1,0,1,NA,Ethnic Studies,NA,TAYLOR & FRANCIS INC,2019-01-06 +soundings,0038-1861,2161-6302,SoundingsJourn,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",PENN STATE UNIV PRESS,2011-07-01 +source-notes in the history of art,0737-4453,2328-207X,NA,1,0,0,0,NA,NA,Art,UNIV CHICAGO PRESS,NA +south african archaeological bulletin,0038-1969,2224-4654,NA,1,0,0,0,NA,NA,Archaeology,SOUTH AFRICAN ARCHAEOLOGICAL SOC,NA +south african geographical journal,0373-6245,2151-2418,sageogj,0,1,0,1,NA,Geography,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-02-11 +south african historical journal,0258-2473,1726-1686,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +south african historical journal,0258-2473,1726-1686,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +south african journal for research in sport physical education and recreation,0379-9069,0379-9069,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,STELLENBOSCH UNIV,NA +south african journal of animal science,0375-1589,2221-4062,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,SOUTH AFRICAN JOURNAL OF ANIMAL SCIENCES,NA +south african journal of botany,0254-6299,1727-9321,NA,0,0,1,0,Plant Sciences,NA,NA,ELSEVIER,NA +south african journal of business management,2078-5585,2078-5976,NA,0,1,0,0,NA,Business | Management,NA,AOSIS,NA +south african journal of chemistry-suid-afrikaanse tydskrif vir chemie,0379-4350,1996-840X,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,BUREAU SCIENTIFIC PUBL,NA +south african journal of economic and management sciences,2222-3436,2222-3436,NA,0,1,0,0,NA,Economics | Management,NA,AOSIS,NA +south african journal of economics,0038-2280,1813-6982,NA,0,1,0,0,NA,Economics,NA,WILEY,NA +south african journal of education,0256-0100,2076-3433,NA,0,1,0,0,NA,Education & Educational Research,NA,EDUCATION ASSOC SOUTH AFRICA,NA +south african journal of enology and viticulture,0253-939X,2224-7904,NA,0,0,1,0,Food Science & Technology,NA,NA,SOUTH AFRICAN SOC ENOLOGY & VITICULTURE-SASEV,NA +south african journal of geology,1012-0750,1996-8590,NA,0,0,1,0,Geology,NA,NA,GEOLOGICAL SOC SOUTH AFRICA,NA +south african journal of industrial engineering,2224-7890,2224-7890,NA,0,0,1,0,"Engineering, Industrial",NA,NA,SOUTHERN AFRICAN INST INDUSTRIAL ENGINEERING,NA +south african journal of philosophy,0258-0136,2073-4867,NA,1,0,0,0,NA,NA,Philosophy,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +south african journal of psychiatry,1608-9685,1608-9685,NA,0,1,1,0,Psychiatry,Psychiatry,NA,AOSIS,NA +south african journal of psychiatry,1608-9685,1608-9685,NA,0,1,1,0,Psychiatry,Psychiatry,NA,AOSIS,NA +south african journal of psychology,0081-2463,2078-208X,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS LTD,NA +south african journal of science,0038-2353,1996-7489,SAJS_Official,0,0,1,1,Multidisciplinary Sciences,NA,NA,ACAD SCIENCE SOUTH AFRICA A S S AF,2014-05-14 +south african journal of surgery,0038-2361,2078-5151,NA,0,0,1,0,Surgery,NA,NA,SA MEDICAL ASSOC,NA +south african journal on human rights,0258-7203,1996-2126,sajhr_za,0,1,0,1,NA,Law,NA,TAYLOR & FRANCIS LTD,2016-10-28 +south american journal of herpetology,1808-9798,NA,NA,0,0,1,0,Zoology,NA,NA,SOC BRASILEIRA HERPETOLOGIA,NA +south asia-journal of south asian studies,0085-6401,1479-0270,southasiajsas,1,1,0,1,NA,Area Studies | History,Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-05-21 +south asia-journal of south asian studies,0085-6401,1479-0270,southasiajsas,1,1,0,1,NA,Area Studies | History,Asian Studies,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-05-21 +south atlantic quarterly,0038-2876,1527-8026,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies | Literary Reviews,DUKE UNIV PRESS,NA +south atlantic quarterly,0038-2876,1527-8026,NA,1,1,0,0,NA,Cultural Studies,Cultural Studies | Literary Reviews,DUKE UNIV PRESS,NA +south central review,0743-6831,1549-3377,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,NA +south dakota review,0038-3368,0038-3368,NA,1,0,0,0,NA,NA,Literary Reviews,UNIV SOUTH DAKOTA,NA +south east asia research,0967-828X,2043-6874,SEAsiaResearch,1,0,0,1,NA,NA,Asian Studies,TAYLOR & FRANCIS LTD,2019-05-29 +south european society and politics,1360-8746,1743-9612,sesp_j,0,1,0,1,NA,Political Science | Social Issues,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-01-13 +southeast asian journal of tropical medicine and public health,0125-1562,0125-1562,NA,0,0,1,0,"Public, Environmental & Occupational Health | Infectious Diseases | Tropical Medicine",NA,NA,SOUTHEAST ASIAN MINISTERS EDUC ORGANIZATION,NA +southeast european and black sea studies,1468-3857,1743-9639,seebssjournal,0,1,0,1,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-01-30 +southeastern naturalist,1528-7092,1938-5412,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,EAGLE HILL INST,NA +southern african humanities,1681-5564,NA,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","NATAL MUSEUM",NA +southern african journal of hiv medicine,1608-9693,2078-6751,sajhivmed,0,0,1,1,Infectious Diseases | Virology,NA,NA,AOSIS,2017-08-03 +southern african linguistics and applied language studies,1607-3614,1727-9461,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,TAYLOR & FRANCIS LTD,NA +southern african linguistics and applied language studies,1607-3614,1727-9461,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,TAYLOR & FRANCIS LTD,NA +southern california law review,0038-3910,0038-3910,scallrev,0,1,0,1,NA,Law,NA,UNIV SOUTHERN CALIF,2013-03-05 +southern cultures,1068-8218,1534-1488,SCquarterly,1,0,0,1,NA,NA,History,UNIV NORTH CAROLINA PRESS,2010-09-09 +southern economic journal,0038-4038,2325-8012,SouthernEconJ,0,1,0,1,NA,Economics,NA,WILEY,2019-05-22 +southern forests-a journal of forest science,2070-2620,2070-2639,NA,0,0,1,0,Forestry,NA,NA,TAYLOR & FRANCIS LTD,NA +southern humanities review,0038-4186,NA,SouthernHReview,1,0,0,1,NA,NA,Literary Theory & Criticism,AUBURN UNIV,2010-09-01 +southern journal of philosophy,0038-4283,2041-6962,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +southern medical journal,0038-4348,1541-8243,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +southwestern entomologist,0147-1724,2162-2647,NA,0,0,1,0,Entomology,NA,NA,SOUTHWESTERN ENTOMOLOGICAL SOC,NA +southwestern historical quarterly,0038-478X,1558-9560,NA,1,0,0,0,NA,NA,History,TEXAS STATE HIST ASSOC,NA +southwestern naturalist,0038-4909,1943-6262,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,SOUTHWESTERN ASSOC NATURALISTS,NA +soziale welt-zeitschrift fur sozialwissenschaftliche forschung und praxis,0038-6073,0038-6073,NA,0,1,0,0,NA,Sociology,NA,NOMOS VERLAGSGESELLSCHAFT MBH & CO KG,NA +space,1228-2472,NA,NA,1,0,0,0,NA,NA,Architecture,SPACE MAGAZINE,NA +space and culture,1206-3312,1552-8308,NA,1,1,0,0,NA,Cultural Studies | Geography,Cultural Studies,SAGE PUBLICATIONS INC,NA +space and culture,1206-3312,1552-8308,NA,1,1,0,0,NA,Cultural Studies | Geography,Cultural Studies,SAGE PUBLICATIONS INC,NA +space policy,0265-9646,1879-338X,NA,0,1,0,0,NA,"International Relations | Social Sciences, Interdisciplinary",NA,ELSEVIER SCI LTD,NA +space science reviews,0038-6308,1572-9672,NA,0,0,1,0,Astronomy & Astrophysics,NA,NA,SPRINGER,NA +space weather-the international journal of research and applications,1542-7390,1542-7390,AGUSpWx,0,0,1,1,Astronomy & Astrophysics | Geochemistry & Geophysics | Meteorology & Atmospheric Sciences,NA,NA,AMER GEOPHYSICAL UNION,2020-02-27 +spanish in context,1571-0718,1571-0726,SpanishContext,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2020-09-21 +spanish in context,1571-0718,1571-0726,SpanishContext,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2020-09-21 +spanish journal of agricultural research,1695-971X,2171-9292,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,INST NACIONAL INVESTIGACION & TECNOLOGIA AGRARIA & ALIMENTARIA-INIA-CSIC,NA +spanish journal of finance and accounting-revista espanola de financiacion y contabilida,0210-2412,2332-0753,refc_sjfa,0,1,0,1,NA,"Business, Finance",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-12-15 +spanish journal of psychology,1138-7416,1988-2904,Spanish_PsyJour,0,1,1,1,Psychology,"Psychology, Multidisciplinary",NA,CAMBRIDGE UNIV PRESS,2021-06-02 +spanish journal of psychology,1138-7416,1988-2904,Spanish_PsyJour,0,1,1,1,Psychology,"Psychology, Multidisciplinary",NA,CAMBRIDGE UNIV PRESS,2021-06-02 +spatial cognition and computation,1387-5868,1542-7633,NA,0,1,0,0,NA,"Psychology, Experimental",NA,TAYLOR & FRANCIS INC,NA +spatial economic analysis,1742-1772,1742-1780,spatialeconomic,0,1,0,1,NA,Economics,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2021-03-01 +spatial statistics,2211-6753,2211-6753,NA,0,0,1,0,"Geosciences, Multidisciplinary | Mathematics, Interdisciplinary Applications | Remote Sensing | Statistics & Probability",NA,NA,ELSEVIER SCI LTD,NA +spe drilling & completion,1064-6671,1930-0204,NA,0,0,1,0,"Engineering, Petroleum",NA,NA,SOC PETROLEUM ENG,NA +spe journal,1086-055X,1930-0220,NA,0,0,1,0,"Engineering, Petroleum",NA,NA,SOC PETROLEUM ENG,NA +spe production & operations,1930-1855,1930-1863,NA,0,0,1,0,"Engineering, Petroleum",NA,NA,SOC PETROLEUM ENG,NA +spe reservoir evaluation & engineering,1094-6470,1930-0212,NA,0,0,1,0,"Energy & Fuels | Engineering, Petroleum | Geosciences, Multidisciplinary",NA,NA,SOC PETROLEUM ENG,NA +spectrochimica acta part a-molecular and biomolecular spectroscopy,1386-1425,1873-3557,NA,0,0,1,0,Spectroscopy,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +spectrochimica acta part b-atomic spectroscopy,0584-8547,1873-3565,NA,0,0,1,0,Spectroscopy,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +spectroscopy,0887-6703,NA,NA,0,0,1,0,Spectroscopy,NA,NA,ADVANSTAR COMMUNICATIONS INC,NA +spectroscopy and spectral analysis,1000-0593,1000-0593,NA,0,0,1,0,Spectroscopy,NA,NA,OFFICE SPECTROSCOPY & SPECTRAL ANALYSIS,NA +spectroscopy letters,0038-7010,1532-2289,NA,0,0,1,0,Spectroscopy,NA,NA,TAYLOR & FRANCIS INC,NA +speculum-a journal of medieval studies,0038-7134,2040-8072,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,UNIV CHICAGO PRESS,NA +speech communication,0167-6393,1872-7182,NA,0,0,1,0,"Acoustics | Computer Science, Interdisciplinary Applications",NA,NA,ELSEVIER,NA +spiegel der letteren,0038-7479,1783-1776,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",PEETERS,NA +spin,2010-3247,2010-3255,NA,0,0,1,0,"Physics, Applied",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +spinal cord,1362-4393,1476-5624,NA,0,0,1,0,Clinical Neurology | Rehabilitation,NA,NA,SPRINGERNATURE,NA +spine,0362-2436,1528-1159,SpinePhilaPA76,0,0,1,1,Clinical Neurology | Orthopedics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-06-09 +spine journal,1529-9430,1878-1632,NA,0,0,1,0,Clinical Neurology | Orthopedics,NA,NA,ELSEVIER SCIENCE INC,NA +spiritus-a journal of christian spirituality,1533-1709,1535-3117,NA,1,0,0,0,NA,NA,Religion,JOHNS HOPKINS UNIV PRESS,NA +spixiana,0341-8391,NA,NA,0,0,1,0,Zoology,NA,NA,VERLAG DR FRIEDRICH PFEIL,NA +sport education and society,1357-3322,1470-1243,NA,0,1,1,0,Sport Sciences,"Education & Educational Research | Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +sport education and society,1357-3322,1470-1243,NA,0,1,1,0,Sport Sciences,"Education & Educational Research | Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +sport exercise and performance psychology,2157-3905,2157-3913,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +sport history review,1087-1659,1543-2947,SHR_HK,1,0,0,1,NA,NA,History,HUMAN KINETICS PUBL INC,2017-05-11 +sport in society,1743-0437,1743-0445,sportinsocietyj,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism | Sociology",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-05-29 +sport management review,1441-3523,1839-2083,SMR_Journal,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism | Management",NA,TAYLOR & FRANCIS LTD,2014-03-25 +sport marketing quarterly,1061-6934,1557-2528,SMQuarterly,0,1,0,1,NA,"Business | Hospitality, Leisure, Sport & Tourism",NA,FITNESS INFORMATION TECHNOLOGY,2018-11-30 +sport psychologist,0888-4781,1543-2793,NA,0,1,1,0,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,HUMAN KINETICS PUBL INC,NA +sport psychologist,0888-4781,1543-2793,NA,0,1,1,0,Psychology | Sport Sciences,"Hospitality, Leisure, Sport & Tourism | Psychology, Applied",NA,HUMAN KINETICS PUBL INC,NA +sports biomechanics,1476-3141,1752-6116,sportsbiomechj,0,0,1,1,"Engineering, Biomedical | Sport Sciences",NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-05-08 +sports health-a multidisciplinary approach,1941-7381,1941-0921,Sports_Health,0,0,1,1,Sport Sciences,NA,NA,SAGE PUBLICATIONS INC,2008-10-03 +sports medicine,0112-1642,1179-2035,SportsMedicineJ,0,0,1,1,Sport Sciences,NA,NA,ADIS INT LTD,2010-03-19 +sports medicine-open,2199-1170,2198-9761,NA,0,0,1,0,Sport Sciences,NA,NA,SPRINGER,NA +sports medicine and arthroscopy review,1062-8592,1538-1951,NA,0,0,1,0,Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +sportverletzung-sportschaden,0932-0555,1439-1236,NA,0,0,1,0,Orthopedics | Sport Sciences,NA,NA,GEORG THIEME VERLAG KG,NA +sprachwissenschaft,0344-8169,2567-6563,NA,1,0,0,0,NA,NA,Language & Linguistics,UNIVERSITATSVERLAG C WINTER HEIDELBERG GMBH,NA +srpski arhiv za celokupno lekarstvo,0370-8179,0370-8179,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SRPSKO LEKARSKO DRUSTVO,NA +ssm-population health,2352-8273,2352-8273,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,NA +ssm-population health,2352-8273,2352-8273,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,ELSEVIER SCI LTD,NA +st petersburg mathematical journal,1061-0022,1547-7371,NA,0,0,1,0,Mathematics,NA,NA,AMER MATHEMATICAL SOC,NA +stahlbau,0038-9145,1437-1049,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,ERNST & SOHN,NA +stand,0038-9366,NA,NA,1,0,0,0,NA,NA,Literary Reviews,STAND,NA +stanford journal of international law,0731-5082,NA,stanf_intl_law,0,1,0,1,NA,International Relations | Law,NA,"STANFORD UNIV, STANFORD LAW SCHOOL",2012-04-16 +stanford law review,0038-9765,1939-8581,stanlrev,0,1,0,1,NA,Law,NA,"STANFORD UNIV, STANFORD LAW SCHOOL",2011-03-02 +starch-starke,0038-9056,1521-379X,NA,0,0,1,0,Food Science & Technology,NA,NA,WILEY-V C H VERLAG GMBH,NA +stat,2049-1573,2049-1573,NA,0,0,1,0,Statistics & Probability,NA,NA,WILEY,NA +stata journal,1536-867X,1536-8734,NA,0,1,1,0,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,SAGE PUBLICATIONS INC,NA +stata journal,1536-867X,1536-8734,NA,0,1,1,0,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,SAGE PUBLICATIONS INC,NA +state politics & policy quarterly,1532-4400,1946-1607,sppqjournal,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2014-05-07 +statistica neerlandica,0039-0402,1467-9574,NA,0,0,1,0,Statistics & Probability,NA,NA,WILEY,NA +statistica sinica,1017-0405,1996-8507,NA,0,0,1,0,Statistics & Probability,NA,NA,STATISTICA SINICA,NA +statistical analysis and data mining,1932-1864,1932-1872,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Interdisciplinary Applications | Statistics & Probability",NA,NA,WILEY,NA +statistical applications in genetics and molecular biology,2194-6302,1544-6115,NA,0,0,1,0,Biochemistry & Molecular Biology | Mathematical & Computational Biology | Statistics & Probability,NA,NA,WALTER DE GRUYTER GMBH,NA +statistical methods and applications,1618-2510,1613-981X,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER HEIDELBERG,NA +statistical methods in medical research,0962-2802,1477-0334,NA,0,0,1,0,Health Care Sciences & Services | Mathematical & Computational Biology | Medical Informatics | Statistics & Probability,NA,NA,SAGE PUBLICATIONS LTD,NA +statistical modelling,1471-082X,1477-0342,NA,0,0,1,0,Statistics & Probability,NA,NA,SAGE PUBLICATIONS LTD,NA +statistical papers,0932-5026,1613-9798,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER,NA +statistical science,0883-4237,2168-8745,NA,0,0,1,0,Statistics & Probability,NA,NA,INST MATHEMATICAL STATISTICS-IMS,NA +statistics,0233-1888,1029-4910,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS LTD,NA +statistics & probability letters,0167-7152,1879-2103,NA,0,0,1,0,Statistics & Probability,NA,NA,ELSEVIER,NA +statistics and computing,0960-3174,1573-1375,NA,0,0,1,0,"Computer Science, Theory & Methods | Statistics & Probability",NA,NA,SPRINGER,NA +statistics and its interface,1938-7989,1938-7997,NA,0,0,1,0,"Mathematical & Computational Biology | Mathematics, Interdisciplinary Applications",NA,NA,"INT PRESS BOSTON, INC",NA +statistics in biopharmaceutical research,1946-6315,1946-6315,NA,0,0,1,0,Mathematical & Computational Biology | Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +statistics in medicine,0277-6715,1097-0258,NA,0,0,1,0,"Mathematical & Computational Biology | Public, Environmental & Occupational Health | Medical Informatics | Medicine, Research & Experimental | Statistics & Probability",NA,NA,WILEY,NA +steel and composite structures,1229-9367,1598-6233,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Materials Science, Composites",NA,NA,TECHNO-PRESS,NA +steel research international,1611-3683,1869-344X,srinjournal,0,0,1,1,Metallurgy & Metallurgical Engineering,NA,NA,WILEY-V C H VERLAG GMBH,2011-07-06 +stem cell reports,2213-6711,2213-6711,stemcellreports,0,0,1,1,Cell & Tissue Engineering | Cell Biology,NA,NA,CELL PRESS,2019-07-25 +stem cell research,1873-5061,1876-7753,NA,0,0,1,0,Cell & Tissue Engineering | Biotechnology & Applied Microbiology | Cell Biology,NA,NA,ELSEVIER,NA +stem cell research & therapy,1757-6512,1757-6512,NA,0,0,1,0,"Cell & Tissue Engineering | Cell Biology | Medicine, Research & Experimental",NA,NA,BMC,NA +stem cell reviews and reports,2629-3269,2629-3277,NA,0,0,1,0,"Cell & Tissue Engineering | Cell Biology | Medicine, Research & Experimental",NA,NA,SPRINGER,NA +stem cells,1066-5099,1549-4918,StemCellsJournl,0,0,1,1,Cell & Tissue Engineering | Biotechnology & Applied Microbiology | Oncology | Cell Biology | Hematology,NA,NA,WILEY,2014-12-03 +stem cells and development,1547-3287,1557-8534,NA,0,0,1,0,"Cell & Tissue Engineering | Hematology | Medicine, Research & Experimental | Transplantation",NA,NA,"MARY ANN LIEBERT, INC",NA +stem cells international,1687-966X,1687-9678,NA,0,0,1,0,Cell & Tissue Engineering,NA,NA,HINDAWI LTD,NA +stem cells translational medicine,2157-6564,2157-6580,StemCellsTM,0,0,1,1,Cell & Tissue Engineering,NA,NA,WILEY,2011-01-24 +stereotactic and functional neurosurgery,1011-6125,1423-0372,NA,0,0,1,0,Neurosciences | Neuroimaging | Surgery,NA,NA,KARGER,NA +steroids,0039-128X,1878-5867,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,ELSEVIER SCIENCE INC,NA +stochastic analysis and applications,0736-2994,1532-9356,NA,0,0,1,0,"Mathematics, Applied | Statistics & Probability",NA,NA,TAYLOR & FRANCIS INC,NA +stochastic environmental research and risk assessment,1436-3240,1436-3259,NA,0,0,1,0,"Engineering, Environmental | Engineering, Civil | Environmental Sciences | Statistics & Probability | Water Resources",NA,NA,SPRINGER,NA +stochastic models,1532-6349,1532-4214,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +stochastic processes and their applications,0304-4149,1879-209X,NA,0,0,1,0,Statistics & Probability,NA,NA,ELSEVIER,NA +stochastics-an international journal of probability and stochastic processes,1744-2508,1744-2516,NA,0,0,1,0,"Mathematics, Applied | Statistics & Probability",NA,NA,TAYLOR & FRANCIS LTD,NA +stochastics and dynamics,0219-4937,1793-6799,NA,0,0,1,0,Statistics & Probability,NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +stochastics and partial differential equations-analysis and computations,2194-0401,2194-041X,NA,0,0,1,0,"Mathematics, Applied | Statistics & Probability",NA,NA,SPRINGER,NA +storia dell arte,0392-4513,NA,NA,1,0,0,0,NA,NA,Art,LUCA EDITORI ARTE ROMA,NA +strad,0039-2049,0039-2049,TheStradMag,1,0,0,1,NA,NA,Music,ORPHEUS PUBLICATIONS LTD,2009-05-08 +strahlentherapie und onkologie,0179-7158,1439-099X,NA,0,0,1,0,"Oncology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SPRINGER HEIDELBERG,NA +strain,0039-2103,1475-1305,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,WILEY,NA +strategic entrepreneurship journal,1932-4391,1932-443X,SEJ_Jour,0,1,0,1,NA,Business | Management,NA,WILEY,2022-01-21 +strategic management journal,0143-2095,1097-0266,SMJ_Jour,0,1,0,1,NA,Business | Management,NA,WILEY,2022-01-07 +strategic organization,1476-1270,1741-315X,NA,0,1,0,0,NA,Business | Management,NA,SAGE PUBLICATIONS LTD,NA +stratigraphy,1547-139X,2331-656X,NA,0,0,1,0,Geology | Paleontology,NA,NA,MICRO PRESS,NA +stratigraphy and geological correlation,0869-5938,1555-6263,NA,0,0,1,0,Geology | Paleontology,NA,NA,PLEIADES PUBLISHING INC,NA +strength and conditioning journal,1524-1602,1533-4295,NSCASCJonline,0,0,1,1,Sport Sciences,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-07-28 +strength of materials,0039-2316,1573-9325,NA,0,0,1,0,"Materials Science, Characterization, Testing",NA,NA,SPRINGER,NA +stress-the international journal on the biology of stress,1025-3890,1607-8888,journal_stress,0,0,1,1,Behavioral Sciences | Endocrinology & Metabolism | Neurosciences,NA,NA,TAYLOR & FRANCIS LTD,2021-10-18 +stress and health,1532-3005,1532-2998,NA,0,1,1,0,Psychiatry | Psychology,"Psychiatry | Psychology, Applied",NA,WILEY,NA +stress and health,1532-3005,1532-2998,NA,0,1,1,0,Psychiatry | Psychology,"Psychiatry | Psychology, Applied",NA,WILEY,NA +strojniski vestnik-journal of mechanical engineering,0039-2480,0039-2480,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ASSOC MECHANICAL ENGINEERS TECHNICIANS SLOVENIA,NA +stroke,0039-2499,1524-4628,StrokeAHA_ASA,0,0,1,1,Clinical Neurology | Peripheral Vascular Diseases,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-12-06 +stroke and vascular neurology,2059-8688,2059-8696,SVN_CSA,0,0,1,1,Clinical Neurology,NA,NA,BMJ PUBLISHING GROUP,2018-03-15 +structural and multidisciplinary optimization,1615-147X,1615-1488,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Engineering, Multidisciplinary | Mechanics",NA,NA,SPRINGER,NA +structural change and economic dynamics,0954-349X,1873-6017,SCEDjournal,0,1,0,1,NA,Economics,NA,ELSEVIER,2020-10-22 +structural chemistry,1040-0400,1572-9001,NA,0,0,1,0,"Chemistry, Multidisciplinary | Chemistry, Physical | Crystallography",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +structural concrete,1464-4177,1751-7648,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,ERNST & SOHN,NA +structural control & health monitoring,1545-2255,1545-2263,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Instruments & Instrumentation",NA,NA,JOHN WILEY & SONS LTD,NA +structural design of tall and special buildings,1541-7794,1541-7808,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,WILEY,NA +structural dynamics-us,2329-7778,2329-7778,NA,0,0,1,0,"Chemistry, Physical | Physics, Atomic, Molecular & Chemical",NA,NA,AIP PUBLISHING,NA +structural engineering and mechanics,1225-4568,1598-6217,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical",NA,NA,TECHNO-PRESS,NA +structural engineering international,1016-8664,1683-0350,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,TAYLOR & FRANCIS LTD,NA +structural equation modeling-a multidisciplinary journal,1070-5511,1532-8007,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +structural equation modeling-a multidisciplinary journal,1070-5511,1532-8007,NA,0,1,1,0,"Mathematics, Interdisciplinary Applications","Social Sciences, Mathematical Methods",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +structural health monitoring-an international journal,1475-9217,1741-3168,NA,0,0,1,0,"Engineering, Multidisciplinary | Instruments & Instrumentation",NA,NA,SAGE PUBLICATIONS LTD,NA +structural safety,0167-4730,1879-3355,NA,0,0,1,0,"Engineering, Civil",NA,NA,ELSEVIER,NA +structure,0969-2126,1878-4186,Structure_CP,0,0,1,1,Biochemistry & Molecular Biology | Biophysics | Cell Biology,NA,NA,CELL PRESS,2012-08-13 +structure and bonding,0081-5993,1616-8550,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Physical",NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +structure and infrastructure engineering,1573-2479,1744-8980,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical",NA,NA,TAYLOR & FRANCIS LTD,NA +structures,2352-0124,2352-0124,NA,0,0,1,0,"Engineering, Civil",NA,NA,ELSEVIER SCIENCE INC,NA +studi e problemi di critica testuale,0049-2361,0049-2361,NA,1,0,0,0,NA,NA,"Language & Linguistics | Literature, Romance",FABRIZIO SERRA EDITORE,NA +studi francesi,0039-2944,0039-2944,NA,1,0,0,0,NA,NA,"Literature, Romance",ROSENBERG & SELLIER,NA +studi medievali,0391-8467,NA,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,CENTRO ITAL STUD SULL ALTO MED,NA +studi musicali-nuova serie,0391-7789,2037-6413,NA,1,0,0,0,NA,NA,Music,"ACCAD NAZ SANTA CECILIA, FONDAZIONE",NA +studi piemontesi,0392-7261,NA,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",CENT STUD PIEMONTESI,NA +studi romani,0039-2995,NA,NA,1,0,0,0,NA,NA,History,IST NAZIONALE STUDI ROMANI,NA +studi secenteschi,0081-6248,2035-7966,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",CASA EDITRICE LEO S OLSCHKI,NA +studi storici,0039-3037,2036-458X,NA,1,0,0,0,NA,NA,History,CAROCCI EDITORE SPA,NA +studia canonica,2295-3019,2295-3027,NA,1,0,0,0,NA,NA,Religion,PEETERS,NA +studia geophysica et geodaetica,0039-3169,1573-1626,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SPRINGER,NA +studia leibnitiana,0039-3185,2366-228X,NA,1,0,0,0,NA,NA,Philosophy,FRANZ STEINER VERLAG GMBH,NA +studia linguistica,0039-3193,1467-9582,NA,1,0,0,0,NA,NA,Language & Linguistics,WILEY,NA +studia logica,0039-3215,1572-8730,NA,1,0,1,0,Mathematics | Logic,NA,Philosophy,SPRINGER,NA +studia logica,0039-3215,1572-8730,NA,1,0,1,0,Mathematics | Logic,NA,Philosophy,SPRINGER,NA +studia mathematica,0039-3223,1730-6337,NA,0,0,1,0,Mathematics,NA,NA,POLISH ACAD SCIENCES INST MATHEMATICS-IMPAN,NA +studia monastica,0039-3258,NA,NA,1,0,0,0,NA,NA,Religion,PUBL ABADIA MONTSERRAT,NA +studia musicologica,1788-6244,1789-2422,NA,1,0,0,0,NA,NA,Music,AKADEMIAI KIADO ZRT,NA +studia neophilologica,0039-3274,1651-2308,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +studia phaenomenologica,1582-5647,2069-0061,NA,1,0,0,0,NA,NA,Philosophy,ROMANIAN SOC PHENOMENOLOGY,NA +studia psychologica,0039-3320,2585-8815,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,SLOVAK ACAD SCIENCES INST EXPERIMENTAL PSYCHOLOGY,NA +studia rosenthaliana,1781-7838,1783-1792,rosenthaliana,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",AMSTERDAM UNIV PRESS,2020-08-25 +studia scientiarum mathematicarum hungarica,0081-6906,1588-2896,NA,0,0,1,0,Mathematics,NA,NA,AKADEMIAI KIADO ZRT,NA +studia theologica-czech republic,1212-8570,2570-9798,NA,1,0,0,0,NA,NA,Religion,UNIV PALACKEHO OLOMOUCI,NA +studia universitatis babes-bolyai chemia,1224-7154,2065-9520,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,UNIV BABES-BOLYAI,NA +studies in american fiction,0091-8083,2158-415X,NA,1,0,0,0,NA,NA,"Literature, American",JOHNS HOPKINS UNIV PRESS,NA +studies in american indian literatures,0730-3238,1548-9590,NA,1,0,0,0,NA,NA,"Literature, American",UNIV NEBRASKA PRESS,NA +studies in american jewish literature,0271-9274,1948-5077,NA,1,0,0,0,NA,NA,"Literature, American",PENN STATE UNIV PRESS,NA +studies in american political development,0898-588X,1469-8692,studiesapd,0,1,0,1,NA,Political Science,NA,CAMBRIDGE UNIV PRESS,2020-06-25 +studies in applied mathematics,0022-2526,1467-9590,NA,0,0,1,0,"Mathematics, Applied",NA,NA,WILEY,NA +studies in canadian literature-etudes en litterature canadienne,0380-6995,1718-7850,NA,1,0,0,0,NA,NA,"Literature, African, Australian, Canadian",UNIV NEW BRUNSWICK,NA +studies in christian ethics,0953-9468,1745-5235,NA,1,0,0,0,NA,NA,Religion,SAGE PUBLICATIONS LTD,NA +studies in comparative international development,0039-3606,1936-6167,SCID__journal,0,1,0,1,NA,Development Studies | International Relations | Political Science,NA,SPRINGER,2021-11-07 +studies in conflict & terrorism,1057-610X,1521-0731,NA,0,1,0,0,NA,International Relations | Political Science,NA,TAYLOR & FRANCIS INC,NA +studies in conservation,0039-3630,2047-0584,NA,1,0,1,0,"Chemistry, Applied | Chemistry, Analytical | Spectroscopy",NA,Art | Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +studies in conservation,0039-3630,2047-0584,NA,1,0,1,0,"Chemistry, Applied | Chemistry, Analytical | Spectroscopy",NA,Art | Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +studies in continuing education,0158-037X,1470-126X,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +studies in east european thought,0925-9392,1573-0948,NA,1,1,0,0,NA,Ethics,Philosophy,SPRINGER,NA +studies in east european thought,0925-9392,1573-0948,NA,1,1,0,0,NA,Ethics,Philosophy,SPRINGER,NA +studies in educational evaluation,0191-491X,NA,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Educational",NA,ELSEVIER,NA +studies in english literature 1500-1900,0039-3657,1522-9270,SEL_1500to1900,1,0,0,1,NA,NA,"Literature, British Isles",JOHNS HOPKINS UNIV PRESS,2017-08-11 +studies in family planning,0039-3665,1728-4465,NA,0,1,0,0,NA,"Demography | Public, Environmental & Occupational Health",NA,WILEY,NA +studies in higher education,0307-5079,1470-174X,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +studies in history and philosophy of modern physics,1355-2198,1879-2502,NA,0,0,1,0,"History & Philosophy Of Science | Physics, Multidisciplinary",NA,NA,ELSEVIER SCI LTD,NA +studies in history and philosophy of science,0039-3681,1879-2510,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,ELSEVIER SCI LTD,NA +studies in history and philosophy of science,0039-3681,1879-2510,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,ELSEVIER SCI LTD,NA +studies in history and philosophy of science,0039-3681,1879-2510,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,ELSEVIER SCI LTD,NA +studies in history and philosophy of science part c-studies in history and philosophy of biological and biomedical sciences,1369-8486,1879-2499,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,ELSEVIER,NA +studies in history and philosophy of science part c-studies in history and philosophy of biological and biomedical sciences,1369-8486,1879-2499,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,ELSEVIER,NA +studies in history and philosophy of science part c-studies in history and philosophy of biological and biomedical sciences,1369-8486,1879-2499,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,ELSEVIER,NA +studies in history and theory of architecture-studii de istoria si teoria arhitecturii,2344-6544,2457-1687,NA,1,0,0,0,NA,NA,Architecture,EDITURA UNIV ION MINCU,NA +studies in informatics and control,1220-1766,1841-429X,NA,0,0,1,0,Automation & Control Systems | Operations Research & Management Science,NA,NA,"NATL INST R&D INFORMATICS-ICI",NA +studies in language,0378-4177,1569-9978,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +studies in language,0378-4177,1569-9978,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +studies in latin american popular culture,0730-9139,2157-2941,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV TEXAS PRESS,NA +studies in mycology,0166-0616,1872-9797,NA,0,0,1,0,Mycology,NA,NA,CENTRAALBUREAU SCHIMMELCULTURE,NA +studies in nonlinear dynamics and econometrics,1081-1826,1558-3708,NA,0,1,0,0,NA,"Economics | Social Sciences, Mathematical Methods",NA,WALTER DE GRUYTER GMBH,NA +studies in philology,0039-3738,1543-0383,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,UNIV NORTH CAROLINA PRESS,NA +studies in philosophy and education,0039-3746,1573-191X,NA,1,1,0,0,NA,Education & Educational Research,Philosophy,SPRINGER,NA +studies in philosophy and education,0039-3746,1573-191X,NA,1,1,0,0,NA,Education & Educational Research,Philosophy,SPRINGER,NA +studies in psychology,0210-9395,1579-3699,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +studies in religion-sciences religieuses,0008-4298,2042-0587,NA,1,0,0,0,NA,NA,Religion,SAGE PUBLICATIONS LTD,NA +studies in romanticism,0039-3762,2330-118X,StudiesInRom,1,0,0,1,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,2020-01-13 +studies in science education,0305-7267,1940-8412,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +studies in science education,0305-7267,1940-8412,NA,0,1,1,0,"Education, Scientific Disciplines",Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +studies in second language acquisition,0272-2631,1470-1545,NA,0,1,0,0,NA,Linguistics,NA,CAMBRIDGE UNIV PRESS,NA +studies in second language learning and teaching,2083-5205,2084-1965,NA,0,1,0,0,NA,Linguistics,NA,"ADAM MICKIEWICZ UNIV, KALISZ",NA +studies in symbolic interaction,0163-2396,NA,NA,0,1,0,0,NA,Sociology,NA,EMERALD GROUP PUBLISHING LTD,NA +studies in the history of gardens & designed landscapes,1460-1176,1943-2186,NA,1,0,0,0,NA,NA,Architecture,TAYLOR & FRANCIS LTD,NA +studies in the literary imagination,0039-3819,2165-2678,NA,1,0,0,0,NA,NA,Literature,GEORGIA STATE UNIV,NA +studies in the novel,0039-3827,1934-1512,studiesinnovel,1,0,0,1,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,2015-02-09 +studies in theatre and performance,1468-2761,2040-0616,JournalStp,1,0,0,1,NA,NA,Theater,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-09-06 +studies in world christianity,1354-9901,1750-0230,NA,1,0,0,0,NA,NA,Religion,EDINBURGH UNIV PRESS,NA +studies on neotropical fauna and environment,0165-0521,1744-5140,NA,0,0,1,0,Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +style,0039-4238,2374-6629,NA,1,0,0,0,NA,NA,Literature | Literary Theory & Criticism | Language & Linguistics,PENN STATE UNIV PRESS,NA +sub-stance,0049-2426,1527-2095,NA,1,0,0,0,NA,NA,Literature,JOHNS HOPKINS UNIV PRESS,NA +substance abuse,0889-7077,1547-0164,substance_abuse,0,1,1,1,Substance Abuse,Substance Abuse,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2009-07-09 +substance abuse,0889-7077,1547-0164,substance_abuse,0,1,1,1,Substance Abuse,Substance Abuse,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2009-07-09 +substance abuse treatment prevention and policy,1747-597X,1747-597X,NA,0,1,0,0,NA,Substance Abuse,NA,BMC,NA +substance use & misuse,1082-6084,1532-2491,NA,0,1,1,0,Substance Abuse | Psychiatry | Psychology,Substance Abuse,NA,TAYLOR & FRANCIS INC,NA +substance use & misuse,1082-6084,1532-2491,NA,0,1,1,0,Substance Abuse | Psychiatry | Psychology,Substance Abuse,NA,TAYLOR & FRANCIS INC,NA +subterranean biology,1768-1448,1314-2615,subtbiol,0,0,1,1,Zoology,NA,NA,INT SOC SUBTERRANEAN BIOL,2011-02-04 +suchttherapie,1439-9903,1439-989X,NA,0,0,1,0,Psychiatry,NA,NA,GEORG THIEME VERLAG KG,NA +sugar industry-zuckerindustrie,0344-8657,NA,NA,0,0,1,0,Food Science & Technology,NA,NA,VERLAG DR ALBERT BARTENS,NA +sugar tech,0972-1525,0974-0740,NA,0,0,1,0,Agronomy,NA,NA,SPRINGER INDIA,NA +suicide and life-threatening behavior,0363-0234,1943-278X,NA,0,1,0,0,NA,"Psychiatry | Psychology, Multidisciplinary",NA,WILEY,NA +sumarski list,0373-1332,1846-9140,NA,0,0,1,0,Forestry,NA,NA,CROATIAN FORESTRY SOC,NA +sungkyun journal of east asian studies,1598-2661,2586-0380,NA,1,0,0,0,NA,NA,Asian Studies,"ACAD EAST ASIAN STUD, SUNGKYUNKWAN UNIVERSITY",NA +superconductor science & technology,0953-2048,1361-6668,NA,0,0,1,0,"Physics, Applied | Physics, Condensed Matter",NA,NA,IOP PUBLISHING LTD,NA +superlattices and microstructures,0749-6036,1096-3677,NA,0,0,1,0,"Physics, Condensed Matter",NA,NA,ACADEMIC PRESS LTD- ELSEVIER SCIENCE LTD,NA +supply chain management-an international journal,1359-8546,1758-6852,NA,0,1,0,0,NA,Business | Management,NA,EMERALD GROUP PUBLISHING LTD,NA +supportive care in cancer,0941-4355,1433-7339,MASCC_JSCC,0,0,1,1,Oncology | Health Care Sciences & Services | Rehabilitation,NA,NA,SPRINGER,2020-09-21 +supramolecular chemistry,1061-0278,1029-0478,SupraMolChem,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,2017-07-06 +supreme court review,0081-9557,2158-2459,supremecourtrev,0,1,0,1,NA,Law,NA,UNIV CHICAGO PRESS,2012-11-01 +surface & coatings technology,0257-8972,1879-3347,NA,0,0,1,0,"Materials Science, Coatings & Films | Physics, Applied",NA,NA,ELSEVIER SCIENCE SA,NA +surface and interface analysis,0142-2421,1096-9918,NA,0,0,1,0,"Chemistry, Physical",NA,NA,WILEY,NA +surface coatings international,1754-0925,NA,NA,0,0,1,0,"Chemistry, Applied | Engineering, Chemical | Materials Science, Coatings & Films",NA,NA,OIL & COLOUR CHEMISTS ASSOC,NA +surface engineering,0267-0844,1743-2944,NA,0,0,1,0,"Materials Science, Coatings & Films",NA,NA,TAYLOR & FRANCIS LTD,NA +surface innovations,2050-6252,2050-6260,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Coatings & Films",NA,NA,ICE PUBLISHING,NA +surface review and letters,0218-625X,1793-6667,NA,0,0,1,0,"Chemistry, Physical | Physics, Condensed Matter",NA,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +surface science,0039-6028,1879-2758,NA,0,0,1,0,"Chemistry, Physical | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +surface science reports,0167-5729,1879-274X,NA,0,0,1,0,"Chemistry, Physical | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +surface topography-metrology and properties,2051-672X,2051-672X,NA,0,0,1,0,"Engineering, Mechanical | Instruments & Instrumentation | Materials Science, Multidisciplinary",NA,NA,IOP PUBLISHING LTD,NA +surfaces and interfaces,2468-0230,2468-0230,NA,0,0,1,0,"Chemistry, Physical | Materials Science, Coatings & Films | Physics, Applied | Physics, Condensed Matter",NA,NA,ELSEVIER,NA +surgeon-journal of the royal colleges of surgeons of edinburgh and ireland,1479-666X,2405-5840,NA,0,0,1,0,Surgery,NA,NA,ROYAL COLLEGE SURGEONS EDINBURGH,NA +surgery,0039-6060,NA,SurgJournal,0,0,1,1,Surgery,NA,NA,MOSBY-ELSEVIER,2015-05-09 +surgery for obesity and related diseases,1550-7289,1878-7533,NA,0,0,1,0,Surgery,NA,NA,ELSEVIER SCIENCE INC,NA +surgery today,0941-1291,1436-2813,NA,0,0,1,0,Surgery,NA,NA,SPRINGER,NA +surgical and radiologic anatomy,0930-1038,1279-8517,NA,0,0,1,0,"Anatomy & Morphology | Radiology, Nuclear Medicine & Medical Imaging | Surgery",NA,NA,SPRINGER FRANCE,NA +surgical clinics of north america,0039-6109,1558-3171,NA,0,0,1,0,Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +surgical endoscopy and other interventional techniques,0930-2794,1432-2218,NA,0,0,1,0,Surgery,NA,NA,SPRINGER,NA +surgical infections,1096-2964,1557-8674,SurgInfxJrnl,0,0,1,1,Infectious Diseases | Surgery,NA,NA,"MARY ANN LIEBERT, INC",2018-05-16 +surgical innovation,1553-3506,1553-3514,NA,0,0,1,0,Surgery,NA,NA,SAGE PUBLICATIONS INC,NA +surgical laparoscopy endoscopy & percutaneous techniques,1530-4515,1534-4908,NA,0,0,1,0,Surgery,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +surgical oncology-oxford,0960-7404,1879-3320,NA,0,0,1,0,Oncology | Surgery,NA,NA,ELSEVIER SCI LTD,NA +surgical oncology clinics of north america,1055-3207,1558-5042,NA,0,0,1,0,Oncology | Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +survey methodology,0714-0045,NA,NA,0,1,1,0,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,STATISTICS CANADA,NA +survey methodology,0714-0045,NA,NA,0,1,1,0,Statistics & Probability,"Social Sciences, Mathematical Methods",NA,STATISTICS CANADA,NA +survey of ophthalmology,0039-6257,1879-3304,survey_of_ophth,0,0,1,1,Ophthalmology,NA,NA,ELSEVIER SCIENCE INC,2022-02-09 +survey research methods,1864-3361,1864-3361,NA,0,1,0,0,NA,"Social Sciences, Mathematical Methods",NA,EUROPEAN SURVEY RESEARCH ASSOCIATION,NA +survey review,0039-6265,1752-2706,NA,0,0,1,0,"Engineering, Civil | Geosciences, Multidisciplinary | Remote Sensing",NA,NA,TAYLOR & FRANCIS LTD,NA +surveys in geophysics,0169-3298,1573-0956,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,SPRINGER,NA +survival,0039-6338,1468-2699,survivaleditors,0,1,0,1,NA,International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-03-12 +sustainability,2071-1050,2071-1050,Sus_MDPI,0,1,1,1,Green & Sustainable Science & Technology | Environmental Sciences,Green & Sustainable Science & Technology | Environmental Studies,NA,MDPI,2015-09-17 +sustainability,2071-1050,2071-1050,Sus_MDPI,0,1,1,1,Green & Sustainable Science & Technology | Environmental Sciences,Green & Sustainable Science & Technology | Environmental Studies,NA,MDPI,2015-09-17 +sustainability accounting management and policy journal,2040-8021,2040-803X,NA,0,1,0,0,NA,"Business, Finance | Environmental Studies | Management",NA,EMERALD GROUP PUBLISHING LTD,NA +sustainability science,1862-4065,1862-4057,NA,0,0,1,0,Green & Sustainable Science & Technology | Environmental Sciences,NA,NA,SPRINGER JAPAN KK,NA +sustainable chemistry and pharmacy,2352-5541,2352-5541,NA,0,0,1,0,"Chemistry, Multidisciplinary | Green & Sustainable Science & Technology | Environmental Sciences",NA,NA,ELSEVIER,NA +sustainable cities and society,2210-6707,2210-6715,NA,0,0,1,0,Construction & Building Technology | Green & Sustainable Science & Technology | Energy & Fuels,NA,NA,ELSEVIER,NA +sustainable computing-informatics & systems,2210-5379,2210-5387,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems",NA,NA,ELSEVIER,NA +sustainable development,0968-0802,1099-1719,NA,0,1,0,0,NA,Development Studies | Green & Sustainable Science & Technology | Regional & Urban Planning,NA,WILEY,NA +sustainable energy & fuels,2398-4902,2398-4902,SusEnergyRSC,0,0,1,1,"Chemistry, Physical | Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,ROYAL SOC CHEMISTRY,2016-08-15 +sustainable energy grids & networks,2352-4677,2352-4677,NA,0,0,1,0,"Energy & Fuels | Engineering, Electrical & Electronic",NA,NA,ELSEVIER,NA +sustainable energy technologies and assessments,2213-1388,2213-1396,NA,0,0,1,0,Green & Sustainable Science & Technology | Energy & Fuels,NA,NA,ELSEVIER,NA +sustainable environment research,2468-2039,2468-2039,NA,0,0,1,0,"Green & Sustainable Science & Technology | Engineering, Environmental | Environmental Sciences",NA,NA,BMC,NA +sustainable materials and technologies,2214-9937,2214-9937,NA,0,0,1,0,"Green & Sustainable Science & Technology | Energy & Fuels | Materials Science, Multidisciplinary",NA,NA,ELSEVIER,NA +sustainable production and consumption,2352-5509,2352-5509,NA,0,1,1,0,Green & Sustainable Science & Technology,Green & Sustainable Science & Technology | Environmental Studies,NA,ELSEVIER,NA +sustainable production and consumption,2352-5509,2352-5509,NA,0,1,1,0,Green & Sustainable Science & Technology,Green & Sustainable Science & Technology | Environmental Studies,NA,ELSEVIER,NA +swarm and evolutionary computation,2210-6502,2210-6510,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +swarm intelligence,1935-3812,1935-3820,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Robotics",NA,NA,SPRINGER,NA +swiss journal of geosciences,1661-8726,1661-8734,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SPRINGER INT PUBL AG,NA +swiss journal of palaeontology,1664-2376,1664-2384,NA,0,0,1,0,Paleontology,NA,NA,SPRINGER INT PUBL AG,NA +swiss medical weekly,1424-7860,1424-3997,SwissMedWkly,0,0,1,1,"Medicine, General & Internal",NA,NA,E M H SWISS MEDICAL PUBLISHERS LTD,2013-05-24 +swiss political science review,1424-7755,1662-6370,spsr_rssp,0,1,0,1,NA,Political Science,NA,WILEY,2021-03-26 +sydowia,0082-0598,NA,NA,0,0,1,0,Mycology,NA,NA,VERLAG FERDINAND BERGER SOHNE GESELLSCHAFT MBH,NA +sylwan,0039-7660,NA,NA,0,0,1,0,Forestry,NA,NA,POLSKIE TOWARZYSTWO LESNE,NA +symbiosis,0334-5114,1878-7665,NA,0,0,1,0,Microbiology,NA,NA,SPRINGER,NA +symbolae osloenses,0039-7679,1502-7805,NA,1,0,0,0,NA,NA,Classics,TAYLOR & FRANCIS LTD,NA +symbolic interaction,0195-6086,1533-8665,sijournal,0,1,0,1,NA,Sociology,NA,WILEY,2013-03-22 +symmetry-basel,2073-8994,2073-8994,Symmetry_MDPI,0,0,1,1,Multidisciplinary Sciences,NA,NA,MDPI,2015-09-11 +symmetry integrability and geometry-methods and applications,1815-0659,1815-0659,NA,0,0,1,0,"Physics, Mathematical",NA,NA,"NATL ACAD SCI UKRAINE, INST MATH",NA +symposium-a quarterly journal in modern literatures,0039-7709,1931-0676,SymposiumJourn1,1,0,0,1,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2020-09-05 +synapse,0887-4476,1098-2396,NA,0,0,1,0,Neurosciences,NA,NA,WILEY,NA +synlett,0936-5214,1437-2096,NA,0,0,1,0,"Chemistry, Organic",NA,NA,GEORG THIEME VERLAG KG,NA +syntax-a journal of theoretical experimental and interdisciplinary research,1368-0005,1467-9612,SyntaxJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,WILEY,2018-08-03 +syntax-a journal of theoretical experimental and interdisciplinary research,1368-0005,1467-9612,SyntaxJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,WILEY,2018-08-03 +syntax and semantics,0092-4563,NA,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,BRILL,NA +syntax and semantics,0092-4563,NA,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,BRILL,NA +synthese,0039-7857,1573-0964,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science | Philosophy,SPRINGER,NA +synthese,0039-7857,1573-0964,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science | Philosophy,SPRINGER,NA +synthese,0039-7857,1573-0964,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science | Philosophy,SPRINGER,NA +synthesis-la plata,0328-1205,1851-779X,NA,1,0,0,0,NA,NA,Classics,"UNIV NAC LA PLATA, FAC HUMANIDADES & CIENCIAS EDUC",NA +synthesis-stuttgart,0039-7881,1437-210X,NA,0,0,1,0,"Chemistry, Organic",NA,NA,GEORG THIEME VERLAG KG,NA +synthesis philosophica,0352-7875,1848-2317,NA,1,0,0,0,NA,NA,Philosophy,CROATIAN PHILOSOPHICAL SOC,NA +synthetic and systems biotechnology,2405-805X,2405-805X,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,KEAI PUBLISHING LTD,NA +synthetic communications,0039-7911,1532-2432,NA,0,0,1,0,"Chemistry, Organic",NA,NA,TAYLOR & FRANCIS INC,NA +synthetic metals,0379-6779,0379-6779,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Condensed Matter | Polymer Science",NA,NA,ELSEVIER SCIENCE SA,NA +system,0346-251X,1879-3282,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,ELSEVIER SCI LTD,NA +system dynamics review,0883-7066,1099-1727,NA,0,1,0,0,NA,"Management | Social Sciences, Mathematical Methods",NA,WILEY,NA +systematic and applied acarology,1362-1971,2056-6069,NA,0,0,1,0,Entomology,NA,NA,"SYSTEMATIC & APPLIED ACAROLOGY SOC LONDON, NATURAL HISTORY MUSEUM",NA +systematic and applied microbiology,0723-2020,1618-0984,NA,0,0,1,0,Biotechnology & Applied Microbiology | Microbiology,NA,NA,ELSEVIER GMBH,NA +systematic biology,1063-5157,1076-836X,NA,0,0,1,0,Evolutionary Biology,NA,NA,OXFORD UNIV PRESS,NA +systematic botany,0363-6445,1548-2324,NA,0,0,1,0,Plant Sciences | Evolutionary Biology,NA,NA,AMER SOC PLANT TAXONOMISTS,NA +systematic entomology,0307-6970,1365-3113,Systematic_Ent,0,0,1,1,Evolutionary Biology | Entomology,NA,NA,WILEY,2015-07-08 +systematic parasitology,0165-5752,1573-5192,NA,0,0,1,0,Parasitology,NA,NA,SPRINGER,NA +systematic reviews,2046-4053,2046-4053,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,BMC,NA +systematics and biodiversity,1477-2000,1478-0933,NA,0,0,1,0,Biodiversity Conservation,NA,NA,TAYLOR & FRANCIS LTD,NA +systemic practice and action research,1094-429X,1573-9295,NA,0,1,0,0,NA,Management,NA,SPRINGER/PLENUM PUBLISHERS,NA +systems & control letters,0167-6911,1872-7956,NA,0,0,1,0,Automation & Control Systems | Operations Research & Management Science,NA,NA,ELSEVIER,NA +systems biology in reproductive medicine,1939-6368,1939-6376,NA,0,0,1,0,Andrology | Reproductive Biology,NA,NA,TAYLOR & FRANCIS INC,NA +systems engineering,1098-1241,1520-6858,NA,0,0,1,0,"Engineering, Industrial | Operations Research & Management Science",NA,NA,WILEY,NA +systems research and behavioral science,1092-7026,1099-1743,NA,0,1,0,0,NA,"Management | Social Sciences, Interdisciplinary",NA,WILEY,NA +taida journal of art history,1023-2095,NA,NA,1,0,0,0,NA,NA,Art,"NATL TAIWAN UNIV, GRADUATE INST ART",NA +taiwanese journal of mathematics,1027-5487,2224-6851,NA,0,0,1,0,Mathematics,NA,NA,MATHEMATICAL SOC REP CHINA,NA +taiwanese journal of obstetrics & gynecology,1028-4559,1875-6263,NA,0,0,1,0,Obstetrics & Gynecology,NA,NA,ELSEVIER TAIWAN,NA +taiwania,0372-333X,NA,NA,0,0,1,0,Plant Sciences,NA,NA,"NATL TAIWAN UNIV PRESS",NA +talanta,0039-9140,1873-3573,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,ELSEVIER,NA +taller de letras,0716-0798,0716-0798,NA,1,0,0,0,NA,NA,"Literature, Romance","PONTIFICIA UNIV CATOLICA CHILE, FAC LETRAS",NA +tanz,1869-7720,1869-7720,tanzzeitschrift,1,0,0,1,NA,NA,Dance,FRIEDRICH BERLIN VERLAG MBH,2014-12-10 +tappi journal,0734-1415,NA,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,TECH ASSOC PULP PAPER IND INC,NA +target-international journal of translation studies,0924-1884,1569-9986,TargetJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2020-01-24 +target-international journal of translation studies,0924-1884,1569-9986,TargetJournal,1,1,0,1,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,2020-01-24 +targeted oncology,1776-2596,1776-260X,TargetOncology,0,0,1,1,Oncology,NA,NA,SPRINGER,2016-09-21 +taxon,0040-0262,1996-8175,NA,0,0,1,0,Plant Sciences | Evolutionary Biology,NA,NA,WILEY,NA +tdr-the drama review-the journal of performance studies,1054-2043,1531-4715,NA,1,0,0,0,NA,NA,Theater,CAMBRIDGE UNIV PRESS,NA +teacher education and special education,0888-4064,1944-4931,NA,0,1,0,0,NA,Education & Educational Research,NA,SAGE PUBLICATIONS INC,NA +teachers and teaching,1354-0602,1470-1278,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +teachers college record,0161-4681,1467-9620,NA,0,1,0,0,NA,Education & Educational Research,NA,TEACHERS COLL OF COLUMBIA UNIV,NA +teaching and learning in medicine,1040-1334,1532-8015,TLMedEd,0,0,1,1,"Education, Scientific Disciplines | Health Care Sciences & Services",NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-08-03 +teaching and teacher education,0742-051X,1879-2480,NA,0,1,0,0,NA,Education & Educational Research,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +teaching in higher education,1356-2517,1470-1294,TeachinginHE,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-02-09 +teaching of psychology,0098-6283,1532-8023,NA,0,1,0,0,NA,"Education & Educational Research | Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS LTD,NA +teaching philosophy,0145-5788,2153-6619,NA,1,0,0,0,NA,NA,Philosophy,PHILOSOPHY DOCUMENTATION CENTER,NA +teaching sociology,0092-055X,1939-862X,teaching_soc,0,1,0,1,NA,Education & Educational Research | Sociology,NA,SAGE PUBLICATIONS INC,2019-04-01 +technical communication,0049-3155,NA,NA,0,1,0,0,NA,Communication,NA,SOC TECHNICAL COMMUNICATION,NA +technical physics,1063-7842,1090-6525,NA,0,0,1,0,"Physics, Applied",NA,NA,PLEIADES PUBLISHING INC,NA +technical physics letters,1063-7850,1090-6533,NA,0,0,1,0,"Physics, Applied",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +techniques in coloproctology,1123-6337,1128-045X,TechColoproctol,0,0,1,1,Gastroenterology & Hepatology | Surgery,NA,NA,SPRINGER-VERLAG ITALIA SRL,2015-06-18 +technological and economic development of economy,2029-4913,2029-4921,NA,0,1,0,0,NA,Economics,NA,VILNIUS GEDIMINAS TECH UNIV,NA +technological forecasting and social change,0040-1625,1873-5509,NA,0,1,0,0,NA,Business | Regional & Urban Planning,NA,ELSEVIER SCIENCE INC,NA +technology analysis & strategic management,0953-7325,1465-3990,NA,0,1,0,0,NA,Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +technology and culture,0040-165X,1097-3729,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,JOHNS HOPKINS UNIV PRESS,NA +technology and culture,0040-165X,1097-3729,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,JOHNS HOPKINS UNIV PRESS,NA +technology and culture,0040-165X,1097-3729,NA,1,1,1,0,History & Philosophy Of Science,History & Philosophy Of Science,History & Philosophy Of Science,JOHNS HOPKINS UNIV PRESS,NA +technology and health care,0928-7329,1878-7401,NA,0,0,1,0,"Health Care Sciences & Services | Engineering, Biomedical",NA,NA,IOS PRESS,NA +technology in cancer research & treatment,1533-0346,1533-0338,NA,0,0,1,0,Oncology,NA,NA,SAGE PUBLICATIONS INC,NA +technology in society,0160-791X,1879-3274,NA,0,1,0,0,NA,"Social Issues | Social Sciences, Interdisciplinary",NA,ELSEVIER SCI LTD,NA +technology pedagogy and education,1475-939X,1747-5139,NA,0,1,0,0,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +technometrics,0040-1706,1537-2723,NA,0,0,1,0,Statistics & Probability,NA,NA,TAYLOR & FRANCIS INC,NA +technovation,0166-4972,1879-2383,Technovation_J,0,1,1,1,"Engineering, Industrial | Operations Research & Management Science",Management,NA,ELSEVIER,2022-03-31 +technovation,0166-4972,1879-2383,Technovation_J,0,1,1,1,"Engineering, Industrial | Operations Research & Management Science",Management,NA,ELSEVIER,2022-03-31 +tecnologia y ciencias del agua,0187-8336,2007-2422,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,INST MEXICANO TECHNOLOGIAAGUA,NA +tectonics,0278-7407,1944-9194,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,AMER GEOPHYSICAL UNION,NA +tectonophysics,0040-1951,1879-3266,NA,0,0,1,0,Geochemistry & Geophysics,NA,NA,ELSEVIER,NA +tehnicki vjesnik-technical gazette,1330-3651,1848-6339,NA,0,0,1,0,"Engineering, Multidisciplinary",NA,NA,"UNIV OSIJEK, TECH FAC",NA +teknik dergi,1300-3453,1300-3453,NA,0,0,1,0,"Engineering, Civil",NA,NA,TURKISH CHAMBER CIVIL ENGINEERS,NA +tekstil ve konfeksiyon,1300-3356,1300-3356,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,EGE UNIV,NA +teksty drugie,0867-0633,2545-2061,NA,1,0,0,0,NA,NA,"Literature, Slavic","POLISH ACAD SCIENCES, INST LITERARY RESEARCH",NA +tel aviv-journal of the institute of archaeology of tel aviv university,0334-4355,2040-4786,NA,1,0,0,0,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +telecommunication systems,1018-4864,1572-9451,NA,0,0,1,0,Telecommunications,NA,NA,SPRINGER,NA +telecommunications policy,0308-5961,1879-3258,NA,0,1,1,0,Telecommunications,Communication | Information Science & Library Science,NA,ELSEVIER SCI LTD,NA +telecommunications policy,0308-5961,1879-3258,NA,0,1,1,0,Telecommunications,Communication | Information Science & Library Science,NA,ELSEVIER SCI LTD,NA +telematics and informatics,0736-5853,NA,NA,0,1,0,0,NA,Information Science & Library Science,NA,ELSEVIER,NA +telemedicine and e-health,1530-5627,1556-3669,Telemedicine_Jn,0,0,1,1,Health Care Sciences & Services,NA,NA,"MARY ANN LIEBERT, INC",2009-09-02 +television & new media,1527-4764,1552-8316,tvnewmedia,1,1,0,1,NA,Communication,"Film, Radio, Television",SAGE PUBLICATIONS INC,2015-04-01 +television & new media,1527-4764,1552-8316,tvnewmedia,1,1,0,1,NA,Communication,"Film, Radio, Television",SAGE PUBLICATIONS INC,2015-04-01 +tellus series a-dynamic meteorology and oceanography,1600-0870,1600-0870,NA,0,0,1,0,Meteorology & Atmospheric Sciences | Oceanography,NA,NA,TAYLOR & FRANCIS LTD,NA +tellus series b-chemical and physical meteorology,1600-0889,1600-0889,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +telopea,0312-9764,2200-4025,NA,0,0,1,0,Plant Sciences,NA,NA,"NATL HERBARIUM NEW SOUTH WALES",NA +telos,0090-6514,1940-459X,NA,1,1,0,0,NA,Political Science | Sociology,Philosophy,TELOS PRESS LTD,NA +telos,0090-6514,1940-459X,NA,1,1,0,0,NA,Political Science | Sociology,Philosophy,TELOS PRESS LTD,NA +temenos,0497-1817,NA,temenos_journal,1,0,0,1,NA,NA,Religion,FINNISH SOC STUDY RELIGION,2020-12-01 +tempo,0040-2982,1478-2286,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +tempo-niteroi,1413-7704,1980-542X,NA,1,0,0,0,NA,NA,History,"UNIV FED FLUMINENSE, DEPT HISTORIA",NA +tempo social,0103-2070,1809-4554,temposocialusp,0,1,0,1,NA,Sociology,NA,"UNIV SAO PAOLO, DEPT SOCIOLOGIA",NA +tenside surfactants detergents,0932-3414,2195-8564,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical | Engineering, Chemical",NA,NA,WALTER DE GRUYTER GMBH,NA +teologia y vida,0049-3449,0717-6295,teologia_y_vida,1,0,0,1,NA,NA,Religion,"PONTIFICIA UNIV CATOLICA CHILE, FACULTAD TEOLOGIA",2020-05-21 +teorema,0210-1602,NA,JournalTeorema,1,0,0,1,NA,NA,Philosophy,KRK EDICIONES,2022-03-31 +teoria-rivista di filosofia,1122-1259,NA,NA,1,0,0,0,NA,NA,Philosophy,EDIZIONI ETS,NA +terapevticheskii arkhiv,0040-3660,2309-5342,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,CJSC CONSILIUM MEDICUM,NA +terapia psicologica,0718-4808,0718-4808,NA,0,1,0,0,NA,"Psychology, Clinical",NA,SOCIEDAD CHILENA PSICOLOGIA CLINICA,NA +terminology,0929-9971,1569-9994,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +terminology,0929-9971,1569-9994,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +terra nova,0954-4879,1365-3121,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,WILEY,NA +terrestrial atmospheric and oceanic sciences,1017-0839,2311-7680,NA,0,0,1,0,"Geosciences, Multidisciplinary | Meteorology & Atmospheric Sciences | Oceanography",NA,NA,CHINESE GEOSCIENCE UNION,NA +territory politics governance,2162-2671,2162-268X,NA,0,1,0,0,NA,Geography | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +terrorism and political violence,0954-6553,1556-1836,terpolv,0,1,0,1,NA,International Relations | Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-11-28 +tesol quarterly,0039-8322,1545-7249,NA,0,1,0,0,NA,Education & Educational Research | Linguistics,NA,WILEY,NA +test,1133-0686,1863-8260,NA,0,0,1,0,Statistics & Probability,NA,NA,SPRINGER,NA +tetrahedron,0040-4020,1464-5416,NA,0,0,1,0,"Chemistry, Organic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +tetrahedron letters,0040-4039,1873-3581,NA,0,0,1,0,"Chemistry, Organic",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +tetsu to hagane-journal of the iron and steel institute of japan,0021-1575,1883-2954,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,IRON STEEL INST JAPAN KEIDANREN KAIKAN,NA +texas heart institute journal,0730-2347,1526-6702,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,TEXAS HEART INST,NA +texas law review,0040-4411,NA,texaslrev,0,1,0,1,NA,Law,NA,TEXAS LAW REVIEW PUBL INC,2012-03-06 +texas studies in literature and language,0040-4691,1534-7303,TSLLJournal,1,0,0,1,NA,NA,Literature,UNIV TEXAS PRESS,2018-07-10 +text & kritik,0040-5329,0040-5329,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",EDITION TEXT KRITIK GMBH,NA +text & talk,1860-7330,1860-7349,NA,1,1,0,0,NA,Communication | Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +text & talk,1860-7330,1860-7349,NA,1,1,0,0,NA,Communication | Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +text and performance quarterly,1046-2937,1479-5760,TPQJournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2022-02-16 +textile-cloth and culture,1475-9756,1751-8350,TextileRout,1,0,0,1,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-10-24 +textile history,0040-4969,1743-2952,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +textile research journal,0040-5175,1746-7748,NA,0,0,1,0,"Materials Science, Textiles",NA,NA,SAGE PUBLICATIONS LTD,NA +textual practice,0950-236X,1470-1308,NA,1,0,0,0,NA,NA,Literature,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +thai journal of veterinary medicine,0125-6491,0125-6491,NA,0,0,1,0,Veterinary Sciences,NA,NA,CHULALONGKORN UNIV,NA +thalassas,0212-5919,2366-1674,NA,0,0,1,0,Marine & Freshwater Biology | Oceanography,NA,NA,SPRINGER INT PUBL AG,NA +theater,0161-0775,1527-196X,NA,1,0,0,0,NA,NA,Theater,DUKE UNIV PRESS,NA +theater heute,0040-5507,0040-5507,Theaterheute,1,0,0,1,NA,NA,Theater,FRIEDRICH BERLIN VERLAG MBH,2009-08-26 +theatre dance and performance training,1944-3927,1944-3919,TDPTblog,1,0,0,1,NA,NA,Dance | Theater,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-11-02 +theatre history studies,0733-2033,2166-9953,NA,1,0,0,0,NA,NA,Theater,UNIV ALABAMA PRESS,NA +theatre journal,0192-2882,1086-332X,JournalTheatre,1,0,0,1,NA,NA,Theater,JOHNS HOPKINS UNIV PRESS,2018-07-13 +theatre notebook,0040-5523,2051-8358,NA,1,0,0,0,NA,NA,Theater,SOC THEATRE RES,NA +theatre research international,0307-8833,1474-0672,theatreintl,1,0,0,1,NA,NA,Theater,CAMBRIDGE UNIV PRESS,2015-09-24 +theatre survey,0040-5574,1475-4533,TheatreSurvey,1,0,0,1,NA,NA,Theater,CAMBRIDGE UNIV PRESS,2020-02-19 +theological studies,0040-5639,2169-1304,theostudies,1,0,0,1,NA,NA,Religion,SAGE PUBLICATIONS LTD,2012-08-30 +theology and science,1474-6700,1474-6719,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science | Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +theology and science,1474-6700,1474-6719,NA,1,0,1,0,History & Philosophy Of Science,NA,History & Philosophy Of Science | Religion,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +theology today,0040-5736,2044-2556,NA,1,0,0,0,NA,NA,Religion,SAGE PUBLICATIONS LTD,NA +theoretical and applied climatology,0177-798X,1434-4483,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,SPRINGER WIEN,NA +theoretical and applied fracture mechanics,0167-8442,1872-7638,NA,0,0,1,0,"Engineering, Mechanical | Mechanics",NA,NA,ELSEVIER,NA +theoretical and applied genetics,0040-5752,1432-2242,TheorApplGenet,0,0,1,1,Agronomy | Plant Sciences | Genetics & Heredity | Horticulture,NA,NA,SPRINGER,2016-06-08 +theoretical and computational fluid dynamics,0935-4964,1432-2250,NA,0,0,1,0,"Mechanics | Physics, Fluids & Plasmas",NA,NA,SPRINGER,NA +theoretical and experimental chemistry,0040-5760,1573-935X,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER,NA +theoretical and experimental plant physiology,2197-0025,2197-0025,NA,0,0,1,0,Plant Sciences,NA,NA,BRAZILIAN SOC PLANT PHYSIOLOGY,NA +theoretical and mathematical physics,0040-5779,1573-9333,NA,0,0,1,0,"Physics, Multidisciplinary | Physics, Mathematical",NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +theoretical biology and medical modelling,1742-4682,1742-4682,NA,0,0,1,0,Mathematical & Computational Biology,NA,NA,BMC,NA +theoretical biology forum,2282-2593,2283-7175,NA,0,0,1,0,Biology,NA,NA,FABRIZIO SERRA EDITORE,NA +theoretical chemistry accounts,1432-881X,1432-2234,TheorChemAcc,0,0,1,1,"Chemistry, Physical",NA,NA,SPRINGER,2012-09-23 +theoretical computer science,0304-3975,1879-2294,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,ELSEVIER,NA +theoretical criminology,1362-4806,1461-7439,TheoreticalCrim,0,1,0,1,NA,Criminology & Penology,NA,SAGE PUBLICATIONS LTD,2022-02-24 +theoretical ecology,1874-1738,1874-1746,NA,0,0,1,0,Ecology,NA,NA,SPRINGER HEIDELBERG,NA +theoretical economics,1933-6837,1555-7561,EconTheory,0,1,0,1,NA,Economics,NA,ECONOMETRIC SOCIETY,2011-02-02 +theoretical foundations of chemical engineering,0040-5795,1608-3431,NA,0,0,1,0,"Engineering, Chemical",NA,NA,PLEIADES PUBLISHING INC,NA +theoretical linguistics,0301-4428,1613-4060,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +theoretical linguistics,0301-4428,1613-4060,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +theoretical medicine and bioethics,1386-7415,1573-1200,NA,0,1,0,0,NA,"Ethics | Social Issues | Social Sciences, Biomedical",NA,SPRINGER,NA +theoretical population biology,0040-5809,1096-0325,NA,0,0,1,0,Ecology | Evolutionary Biology | Genetics & Heredity | Mathematical & Computational Biology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +theoria-a swedish journal of philosophy,0040-5825,1755-2567,TheoriaJournal,1,0,0,1,NA,NA,Philosophy,WILEY,2021-11-15 +theoria-revista de teoria historia y fundamentos de la ciencia,0495-4548,2171-679X,NA,1,0,0,0,NA,NA,History & Philosophy Of Science,SERVICIO EDITORIAL UNIVERSIDAD DEL PAIS VASCO,NA +theory & psychology,0959-3543,1461-7447,Theory_Psych,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,SAGE PUBLICATIONS LTD,2019-11-19 +theory and applications of categories,1201-561X,NA,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,MOUNT ALLISON UNIV,NA +theory and decision,0040-5833,1573-7187,NA,0,1,0,0,NA,"Economics | Social Sciences, Mathematical Methods",NA,SPRINGER,NA +theory and practice of logic programming,1471-0684,1475-3081,NA,0,0,1,0,"Computer Science, Software Engineering | Computer Science, Theory & Methods | Logic",NA,NA,CAMBRIDGE UNIV PRESS,NA +theory and research in social education,0093-3104,2163-1654,TRSE_Editor,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2016-01-13 +theory and society,0304-2421,1573-7853,NA,0,1,0,0,NA,Sociology,NA,SPRINGER,NA +theory culture & society,0263-2764,1460-3616,TCSjournalSAGE,1,1,0,1,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS LTD,2010-03-14 +theory culture & society,0263-2764,1460-3616,TCSjournalSAGE,1,1,0,1,NA,Cultural Studies,Cultural Studies,SAGE PUBLICATIONS LTD,2010-03-14 +theory in biosciences,1431-7613,1611-7530,NA,0,0,1,0,Biology | Mathematical & Computational Biology,NA,NA,SPRINGER,NA +theory into practice,0040-5841,1543-0421,TiP_Jrnl,0,1,0,1,NA,Education & Educational Research,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-04-15 +theory of computing,1557-2862,1557-2862,NA,0,0,1,0,"Computer Science, Theory & Methods",NA,NA,"UNIV CHICAGO, DEPT COMPUTER SCIENCE",NA +theory of computing systems,1432-4350,1433-0490,NA,0,0,1,0,"Computer Science, Theory & Methods | Mathematics",NA,NA,SPRINGER,NA +theory of probability and its applications,0040-585X,1095-7219,NA,0,0,1,0,Statistics & Probability,NA,NA,SIAM PUBLICATIONS,NA +theranostics,1838-7640,1838-7640,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,IVYSPRING INT PUBL,NA +therapeutic advances in chronic disease,2040-6223,2040-6231,TAChronicDis,0,0,1,1,Pharmacology & Pharmacy,NA,NA,SAGE PUBLICATIONS LTD,2019-03-04 +therapeutic advances in drug safety,2042-0986,2042-0994,TADrugSafety,0,0,1,1,Pharmacology & Pharmacy,NA,NA,SAGE PUBLICATIONS LTD,2019-01-04 +therapeutic advances in endocrinology and metabolism,2042-0188,2042-0196,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,SAGE PUBLICATIONS LTD,NA +therapeutic advances in gastroenterology,1756-283X,1756-2848,TAGastroenterol,0,0,1,1,Gastroenterology & Hepatology,NA,NA,SAGE PUBLICATIONS LTD,2020-09-16 +therapeutic advances in hematology,2040-6207,2040-6215,TAHematol,0,0,1,1,Hematology,NA,NA,SAGE PUBLICATIONS LTD,2020-09-23 +therapeutic advances in medical oncology,1758-8340,1758-8359,TAMedOncol,0,0,1,1,Oncology,NA,NA,SAGE PUBLICATIONS LTD,2018-01-22 +therapeutic advances in musculoskeletal disease,1759-720X,1759-7218,TAMuscDis,0,0,1,1,Rheumatology,NA,NA,SAGE PUBLICATIONS LTD,2020-07-08 +therapeutic advances in neurological disorders,1756-2856,1756-2864,TANeurolDisord,0,0,1,1,Clinical Neurology,NA,NA,SAGE PUBLICATIONS LTD,2019-01-24 +therapeutic advances in psychopharmacology,2045-1253,2045-1261,TAPsychopharm,0,0,1,1,Pharmacology & Pharmacy | Psychiatry,NA,NA,SAGE PUBLICATIONS LTD,2020-05-07 +therapeutic advances in respiratory disease,1753-4658,1753-4666,TARespirDis,0,0,1,1,Respiratory System,NA,NA,SAGE PUBLICATIONS LTD,2019-01-24 +therapeutic advances in urology,1756-2872,1756-2880,TA_Urology,0,0,1,1,Urology & Nephrology,NA,NA,SAGE PUBLICATIONS LTD,2022-04-04 +therapeutic apheresis and dialysis,1744-9979,1744-9987,NA,0,0,1,0,Hematology | Urology & Nephrology,NA,NA,WILEY,NA +therapeutic drug monitoring,0163-4356,1536-3694,NA,0,0,1,0,Medical Laboratory Technology | Pharmacology & Pharmacy | Toxicology,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +therapeutic hypothermia and temperature management,2153-7658,2153-7933,NA,0,0,1,0,Critical Care Medicine,NA,NA,"MARY ANN LIEBERT, INC",NA +therapeutic innovation & regulatory science,2168-4790,2168-4804,NA,0,0,1,0,Medical Informatics | Pharmacology & Pharmacy,NA,NA,SPRINGER HEIDELBERG,NA +therapeutics and clinical risk management,1178-203X,1178-203X,NA,0,0,1,0,Health Care Sciences & Services,NA,NA,DOVE MEDICAL PRESS LTD,NA +therapie,0040-5957,1958-5578,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER,NA +theriogenology,0093-691X,1879-3231,NA,0,0,1,0,Reproductive Biology | Veterinary Sciences,NA,NA,ELSEVIER SCIENCE INC,NA +thermal science,0354-9836,2334-7163,NA,0,0,1,0,Thermodynamics,NA,NA,VINCA INST NUCLEAR SCI,NA +thermal science and engineering progress,2451-9049,2451-9049,NA,0,0,1,0,"Thermodynamics | Mechanics | Energy & Fuels | Engineering, Mechanical",NA,NA,ELSEVIER,NA +thermochimica acta,0040-6031,1872-762X,NA,0,0,1,0,"Thermodynamics | Chemistry, Analytical | Chemistry, Physical",NA,NA,ELSEVIER,NA +thermophysics and aeromechanics,0869-8643,1531-8699,NA,0,0,1,0,"Engineering, Aerospace | Thermodynamics | Engineering, Mechanical | Mechanics",NA,NA,PLEIADES PUBLISHING INC,NA +thin-walled structures,0263-8231,1879-3223,NA,0,0,1,0,"Engineering, Civil | Engineering, Mechanical | Mechanics",NA,NA,ELSEVIER SCI LTD,NA +thin solid films,0040-6090,1879-2731,NA,0,0,1,0,"Materials Science, Multidisciplinary | Materials Science, Coatings & Films | Physics, Applied | Physics, Condensed Matter",NA,NA,ELSEVIER SCIENCE SA,NA +thinking & reasoning,1354-6783,1464-0708,NA,0,1,0,0,NA,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +thinking skills and creativity,1871-1871,1878-0423,NA,0,1,0,0,NA,Education & Educational Research,NA,ELSEVIER SCI LTD,NA +third text,0952-8822,1475-5297,thirdtext_,1,0,0,1,NA,NA,Art,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-10-09 +third world quarterly,0143-6597,1360-2241,thirdworldq,0,1,0,1,NA,Development Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-07-21 +thomas wolfe review,0276-5683,2169-1452,NA,1,0,0,0,NA,NA,"Literature, American",THOMAS WOLFE SOC,NA +thomist,0040-6325,NA,NA,1,0,0,0,NA,NA,Philosophy | Religion,THOMIST PRESS,NA +thoracic and cardiovascular surgeon,0171-6425,1439-1902,TCSurgeon,0,0,1,1,Cardiac & Cardiovascular System | Respiratory System | Surgery,NA,NA,GEORG THIEME VERLAG KG,2019-02-22 +thoracic cancer,1759-7706,1759-7714,NA,0,0,1,0,Oncology | Respiratory System,NA,NA,WILEY,NA +thoracic surgery clinics,1547-4127,1558-5069,NA,0,0,1,0,Respiratory System | Surgery,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +thorax,0040-6376,1468-3296,ThoraxBMJ,0,0,1,1,Respiratory System,NA,NA,BMJ PUBLISHING GROUP,2010-05-07 +thought-a journal of philosophy,2161-2234,2161-2234,NA,1,0,0,0,NA,NA,Philosophy,WILEY,NA +thrombosis and haemostasis,0340-6245,2567-689X,NA,0,0,1,0,Hematology | Peripheral Vascular Diseases,NA,NA,GEORG THIEME VERLAG KG,NA +thrombosis journal,1477-9560,1477-9560,Thrombosis_J,0,0,1,1,Hematology | Peripheral Vascular Diseases,NA,NA,BMC,2017-03-03 +thrombosis research,0049-3848,1879-2472,ThrombosisRese1,0,0,1,1,Hematology | Peripheral Vascular Diseases,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2018-08-17 +thyroid,1050-7256,1557-9077,thyroidjournal,0,0,1,1,Endocrinology & Metabolism,NA,NA,"MARY ANN LIEBERT, INC",2018-10-31 +ticks and tick-borne diseases,1877-959X,1877-9603,NA,0,0,1,0,Infectious Diseases | Microbiology | Parasitology,NA,NA,ELSEVIER GMBH,NA +tidsskrift for samfunnsforskning,0040-716X,1504-291X,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,UNIVERSITETSFORLAGET A S,NA +tieraerztliche praxis ausgabe grosstiere nutztiere,1434-1220,2567-5834,NA,0,0,1,0,Veterinary Sciences,NA,NA,GEORG THIEME VERLAG KG,NA +tieraerztliche praxis ausgabe kleintiere heimtiere,1434-1239,2567-5842,NA,0,0,1,0,Veterinary Sciences,NA,NA,GEORG THIEME VERLAG KG,NA +tieraerztliche umschau,0049-3864,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,TERRA-VERLAG GMBH,NA +tijdschrift voor communicatiewetenschap,1384-6930,1875-7286,TCW_AUP,0,1,0,1,NA,Communication,NA,UITGEVERIJ BOOM BV,2021-09-06 +tijdschrift voor diergeneeskunde,0040-7453,0040-7453,NA,0,0,1,0,Veterinary Sciences,NA,NA,KONINKLIJKE NEDERLANDSE MAATSCHAPPIJ VOOR DIERGENEESKUNDE,NA +tijdschrift voor economische en sociale geografie,0040-747X,1467-9663,tesg_journal,0,1,0,1,NA,Economics | Geography,NA,WILEY,2017-11-27 +tijdschrift voor filosofie,0040-750X,2031-8952,NA,1,0,0,0,NA,NA,Philosophy,PEETERS,NA +tijdschrift voor geschiedenis,0040-7518,0040-7518,TijdschrvGesch,1,0,0,1,NA,NA,History,WOLTERS-NOORDHOFF B V,2015-09-18 +tijdschrift voor nederlandse taal-en letterkunde,0040-7550,2212-0521,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",AMSTERDAM UNIV PRESS,NA +tijdschrift voor rechtsgeschiedenis-revue d histoire du droit-the legal history review,0040-7585,0040-7585,TijdschriftR,1,1,0,1,NA,History | Law,History,BRILL,2021-02-26 +tijdschrift voor rechtsgeschiedenis-revue d histoire du droit-the legal history review,0040-7585,0040-7585,TijdschriftR,1,1,0,1,NA,History | Law,History,BRILL,2021-02-26 +time & mind-the journal of archaeology consciousness and culture,1751-696X,1751-6978,NA,1,0,0,0,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +time & society,0961-463X,1461-7463,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,SAGE PUBLICATIONS LTD,NA +tissue & cell,0040-8166,1532-3072,NA,0,0,1,0,Anatomy & Morphology | Cell Biology,NA,NA,CHURCHILL LIVINGSTONE,NA +tissue engineering and regenerative medicine,1738-2696,2212-5469,NA,0,0,1,0,"Cell & Tissue Engineering | Engineering, Biomedical",NA,NA,KOREAN TISSUE ENGINEERING REGENERATIVE MEDICINE SOC,NA +tissue engineering part a,1937-3341,1937-335X,NA,0,0,1,0,"Cell & Tissue Engineering | Cell Biology | Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,"MARY ANN LIEBERT, INC",NA +tissue engineering part b-reviews,1937-3368,1937-3376,NA,0,0,1,0,"Cell & Tissue Engineering | Cell Biology | Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,"MARY ANN LIEBERT, INC",NA +tissue engineering part c-methods,1937-3384,1937-3392,NA,0,0,1,0,"Cell & Tissue Engineering | Cell Biology | Engineering, Biomedical | Materials Science, Biomaterials",NA,NA,"MARY ANN LIEBERT, INC",NA +tls-the times literary supplement,0307-661X,1366-7211,TheTLS,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",TIMES SUPPLEMENTS LIMITED,2007-12-07 +tm-technisches messen,0171-8096,2196-7113,NA,0,0,1,0,Instruments & Instrumentation,NA,NA,WALTER DE GRUYTER GMBH,NA +tobacco control,0964-4563,1468-3318,TC_BMJ,0,1,1,1,"Substance Abuse | Public, Environmental & Occupational Health","Substance Abuse | Public, Environmental & Occupational Health",NA,BMJ PUBLISHING GROUP,2010-05-07 +tobacco control,0964-4563,1468-3318,TC_BMJ,0,1,1,1,"Substance Abuse | Public, Environmental & Occupational Health","Substance Abuse | Public, Environmental & Occupational Health",NA,BMJ PUBLISHING GROUP,2010-05-07 +tobacco induced diseases,1617-9625,1617-9625,NA,0,1,1,0,"Substance Abuse | Public, Environmental & Occupational Health","Substance Abuse | Public, Environmental & Occupational Health",NA,EUROPEAN PUBLISHING,NA +tobacco induced diseases,1617-9625,1617-9625,NA,0,1,1,0,"Substance Abuse | Public, Environmental & Occupational Health","Substance Abuse | Public, Environmental & Occupational Health",NA,EUROPEAN PUBLISHING,NA +tobacco regulatory science,2333-9748,2333-9748,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,TOBACCO REGULATORY SCIENCE GROUP,NA +tobacco regulatory science,2333-9748,2333-9748,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,TOBACCO REGULATORY SCIENCE GROUP,NA +tohoku journal of experimental medicine,0040-8727,1349-3329,NA,0,0,1,0,"Medicine, General & Internal | Medicine, Research & Experimental",NA,NA,TOHOKU UNIV MEDICAL PRESS,NA +tohoku mathematical journal,0040-8735,0040-8735,NA,0,0,1,0,Mathematics,NA,NA,TOHOKU UNIVERSITY,NA +tokyo journal of mathematics,0387-3870,NA,NA,0,0,1,0,Mathematics,NA,NA,TOKYO JOURNAL MATHEMATICS EDITORIAL OFFICE ACAD CENTER,NA +tomography,2379-1381,2379-139X,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,MDPI,NA +top,1134-5764,1863-8279,NA,0,0,1,0,Operations Research & Management Science,NA,NA,SPRINGER,NA +topia-canadian journal of cultural studies,1206-0143,1916-0194,topiajournal,1,1,0,1,NA,Cultural Studies,Cultural Studies,UNIV TORONTO PRESS INC,2016-06-17 +topia-canadian journal of cultural studies,1206-0143,1916-0194,topiajournal,1,1,0,1,NA,Cultural Studies,Cultural Studies,UNIV TORONTO PRESS INC,2016-06-17 +topics in applied physics,0303-4216,1437-0859,NA,0,0,1,0,"Physics, Applied",NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +topics in catalysis,1022-5528,1572-9028,NA,0,0,1,0,"Chemistry, Applied | Chemistry, Physical",NA,NA,SPRINGER/PLENUM PUBLISHERS,NA +topics in clinical nutrition,0883-5691,1550-5146,TCN_online,0,0,1,1,Nutrition & Dietetics,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2010-09-08 +topics in cognitive science,1756-8757,1756-8765,NA,0,1,0,0,NA,"Psychology, Experimental",NA,WILEY,NA +topics in companion animal medicine,1938-9736,1946-9837,NA,0,0,1,0,Veterinary Sciences,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +topics in current chemistry,2365-0869,2364-8961,NA,0,0,1,0,"Chemistry, Multidisciplinary",NA,NA,SPRINGER INT PUBL AG,NA +topics in early childhood special education,0271-1214,1538-4845,NA,0,1,0,0,NA,"Education, Special",NA,SAGE PUBLICATIONS INC,NA +topics in geriatric rehabilitation,0882-7524,1550-2414,NA,0,1,0,0,NA,Gerontology | Rehabilitation,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +topics in language disorders,0271-8294,1550-3259,NA,0,1,0,0,NA,Linguistics | Rehabilitation,NA,LIPPINCOTT WILLIAMS & WILKINS,NA +topics in organometallic chemistry,1436-6002,1616-8534,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,SPRINGER INTERNATIONAL PUBLISHING AG,NA +topics in stroke rehabilitation,1074-9357,1945-5119,NA,0,0,1,0,Rehabilitation,NA,NA,TAYLOR & FRANCIS LTD,NA +topoi-an international review of philosophy,0167-7411,1572-8749,NA,1,0,0,0,NA,NA,Philosophy,SPRINGER,NA +topological methods in nonlinear analysis,1230-3429,1230-3429,NA,0,0,1,0,Mathematics,NA,NA,JULIUSZ SCHAUDER CTR NONLINEAR STUDIES,NA +topology and its applications,0166-8641,1879-3207,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,ELSEVIER,NA +total quality management & business excellence,1478-3363,1478-3371,NA,0,1,0,0,NA,Management,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +toung pao,0082-5433,1568-5322,NA,1,0,0,0,NA,NA,Asian Studies,BRILL,NA +tourism economics,1354-8166,2044-0375,NA,0,1,0,0,NA,"Economics | Hospitality, Leisure, Sport & Tourism",NA,SAGE PUBLICATIONS LTD,NA +tourism geographies,1461-6688,1470-1340,TourismJournal,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2010-05-27 +tourism management,0261-5177,1879-3193,NA,0,1,0,0,NA,"Environmental Studies | Hospitality, Leisure, Sport & Tourism | Management",NA,ELSEVIER SCI LTD,NA +tourism management perspectives,2211-9736,2211-9744,NA,0,1,0,0,NA,"Hospitality, Leisure, Sport & Tourism | Management",NA,ELSEVIER,NA +tourism review,1660-5373,1759-8451,Tourism__Review,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism",NA,EMERALD GROUP PUBLISHING LTD,2021-10-19 +tourist studies,1468-7976,1741-3206,TouristStudies,0,1,0,1,NA,"Hospitality, Leisure, Sport & Tourism",NA,SAGE PUBLICATIONS INC,2021-03-10 +toxicologic pathology,0192-6233,1533-1601,NA,0,0,1,0,Pathology | Toxicology,NA,NA,SAGE PUBLICATIONS INC,NA +toxicological and environmental chemistry,0277-2248,1029-0486,NA,0,0,1,0,Environmental Sciences | Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +toxicological sciences,1096-6080,1096-0929,ToxSci,0,0,1,1,Toxicology,NA,NA,OXFORD UNIV PRESS,2009-05-18 +toxicology,0300-483X,1879-3185,NA,0,0,1,0,Pharmacology & Pharmacy | Toxicology,NA,NA,ELSEVIER IRELAND LTD,NA +toxicology and applied pharmacology,0041-008X,1096-0333,pharmacotoxic,0,0,1,1,Pharmacology & Pharmacy | Toxicology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +toxicology and applied pharmacology,0041-008X,1096-0333,pharmacotoxic,0,0,1,1,Pharmacology & Pharmacy | Toxicology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +toxicology and industrial health,0748-2337,1477-0393,NA,0,0,1,0,"Public, Environmental & Occupational Health | Toxicology",NA,NA,SAGE PUBLICATIONS INC,NA +toxicology in vitro,0887-2333,1879-3177,NA,0,0,1,0,Toxicology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +toxicology letters,0378-4274,1879-3169,NA,0,0,1,0,Toxicology,NA,NA,ELSEVIER IRELAND LTD,NA +toxicology mechanisms and methods,1537-6516,1537-6524,NA,0,0,1,0,Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +toxicology research,2045-452X,2045-4538,ToxRes,0,0,1,1,Toxicology,NA,NA,OXFORD UNIV PRESS,2011-11-17 +toxicon,0041-0101,1879-3150,NA,0,0,1,0,Pharmacology & Pharmacy | Toxicology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +toxics,2305-6304,2305-6304,Toxics_MDPI,0,0,1,1,Environmental Sciences | Toxicology,NA,NA,MDPI,2017-07-26 +toxin reviews,1556-9543,1556-9551,NA,0,0,1,0,Toxicology,NA,NA,TAYLOR & FRANCIS INC,NA +toxins,2072-6651,2072-6651,Toxins_MDPI,0,0,1,1,Toxicology,NA,NA,MDPI,2015-05-05 +trabajos de prehistoria,0082-5638,1988-3218,NA,1,1,0,0,NA,Anthropology,Archaeology,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +trabajos de prehistoria,0082-5638,1988-3218,NA,1,1,0,0,NA,Anthropology,Archaeology,CONSEJO SUPERIOR INVESTIGACIONES CIENTIFICAS-CSIC,NA +trac-trends in analytical chemistry,0165-9936,1879-3142,NA,0,0,1,0,"Chemistry, Analytical",NA,NA,ELSEVIER SCI LTD,NA +trace elements and electrolytes,0946-2104,0946-2104,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,DUSTRI-VERLAG DR KARL FEISTLE,NA +traditio-studies in ancient and medieval history thought and religion,0362-1529,2166-5508,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,CAMBRIDGE UNIV PRESS,NA +traffic,1398-9219,1600-0854,TrafficJournal,0,0,1,1,Cell Biology,NA,NA,WILEY,2018-11-20 +traffic injury prevention,1538-9588,1538-957X,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Transportation",NA,TAYLOR & FRANCIS INC,NA +traffic injury prevention,1538-9588,1538-957X,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Transportation",NA,TAYLOR & FRANCIS INC,NA +training and education in professional psychology,1931-3918,1931-3926,NA,0,1,0,0,NA,"Psychology, Educational",NA,EDUCATIONAL PUBLISHING FOUNDATION-AMERICAN PSYCHOLOGICAL ASSOC,NA +traitement du signal,0765-0019,1958-5608,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,INT INFORMATION & ENGINEERING TECHNOLOGY ASSOC,NA +trames-journal of the humanities and social sciences,1406-0922,1736-7514,NA,1,1,0,0,NA,"Social Sciences, Interdisciplinary","Humanities, Multidisciplinary",ESTONIAN ACAD PUBLISHERS,NA +trames-journal of the humanities and social sciences,1406-0922,1736-7514,NA,1,1,0,0,NA,"Social Sciences, Interdisciplinary","Humanities, Multidisciplinary",ESTONIAN ACAD PUBLISHERS,NA +trans-form-acao,0101-3173,1980-539X,trans_da,1,0,0,1,NA,NA,Philosophy,UNESP-MARILIA,2020-01-22 +transactions in gis,1361-1682,1467-9671,NA,0,1,0,0,NA,Geography,NA,WILEY,NA +transactions of famena,1333-1124,1333-1124,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,UNIV ZAGREB FAC MECHANICAL ENGINEERING & NAVAL ARCHITECTURE,NA +transactions of nonferrous metals society of china,1003-6326,2210-3384,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,ELSEVIER,NA +transactions of the american entomological society,0002-8320,2162-3139,TransactionsAES,0,0,1,1,Entomology,NA,NA,AMER ENTOMOL SOC,2016-04-04 +transactions of the american fisheries society,0002-8487,1548-8659,NA,0,0,1,0,Fisheries,NA,NA,WILEY,NA +transactions of the american mathematical society,0002-9947,1088-6850,NA,0,0,1,0,Mathematics,NA,NA,AMER MATHEMATICAL SOC,NA +transactions of the american philological association,0360-5949,1533-0699,NA,1,0,0,0,NA,NA,Classics,JOHNS HOPKINS UNIV PRESS,NA +transactions of the ancient monuments society,0951-001X,NA,NA,1,0,0,0,NA,NA,Architecture | Archaeology,ANCIENT MONUMENTS SOC,NA +transactions of the asabe,2151-0032,2151-0040,NA,0,0,1,0,Agricultural Engineering,NA,NA,AMER SOC AGRICULTURAL & BIOLOGICAL ENGINEERS,NA +transactions of the association for computational linguistics,NA,2307-387X,NA,1,1,1,0,"Computer Science, Artificial Intelligence",Linguistics,Language & Linguistics,MIT PRESS,NA +transactions of the association for computational linguistics,NA,2307-387X,NA,1,1,1,0,"Computer Science, Artificial Intelligence",Linguistics,Language & Linguistics,MIT PRESS,NA +transactions of the association for computational linguistics,NA,2307-387X,NA,1,1,1,0,"Computer Science, Artificial Intelligence",Linguistics,Language & Linguistics,MIT PRESS,NA +transactions of the canadian society for mechanical engineering,0315-8977,NA,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,CANADIAN SCIENCE PUBLISHING,NA +transactions of the charles s peirce society,0009-1774,1558-9587,NA,1,0,0,0,NA,NA,Philosophy,INDIANA UNIV PRESS,NA +transactions of the indian ceramic society,0371-750X,2165-5456,NA,0,0,1,0,"Materials Science, Ceramics",NA,NA,TAYLOR & FRANCIS LTD,NA +transactions of the indian institute of metals,0972-2815,0975-1645,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER INDIA,NA +transactions of the institute of british geographers,0020-2754,1475-5661,rgs_ibghe,0,1,0,1,NA,Geography,NA,WILEY,2015-02-11 +transactions of the institute of measurement and control,0142-3312,1477-0369,NA,0,0,1,0,Automation & Control Systems | Instruments & Instrumentation,NA,NA,SAGE PUBLICATIONS LTD,NA +transactions of the institute of metal finishing,0020-2967,1745-9192,NA,0,0,1,0,"Electrochemistry | Metallurgy & Metallurgical Engineering | Materials Science, Coatings & Films",NA,NA,TAYLOR & FRANCIS LTD,NA +transactions of the japan society for aeronautical and space sciences,0549-3811,0549-3811,NA,0,0,1,0,"Engineering, Aerospace",NA,NA,JAPAN SOC AERONAUT SPACE SCI,NA +transactions of the philological society,0079-1636,1467-968X,NA,1,0,0,0,NA,NA,Language & Linguistics,WILEY,NA +transactions of the royal society of south australia,0372-1426,2204-0293,NA,0,0,1,0,Multidisciplinary Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +transactions of the royal society of tropical medicine and hygiene,0035-9203,1878-3503,NA,0,0,1,0,"Public, Environmental & Occupational Health | Tropical Medicine",NA,NA,OXFORD UNIV PRESS,NA +transactions on emerging telecommunications technologies,2161-3915,2161-3915,NA,0,0,1,0,Telecommunications,NA,NA,WILEY,NA +transboundary and emerging diseases,1865-1674,1865-1682,NA,0,0,1,0,Infectious Diseases | Veterinary Sciences,NA,NA,WILEY,NA +transcultural psychiatry,1363-4615,1461-7471,transcultpsych,0,1,0,1,NA,Anthropology | Psychiatry,NA,SAGE PUBLICATIONS LTD,2018-09-13 +transfer-european review of labour and research,1024-2589,1996-7284,transfer_etui,0,1,0,1,NA,Industrial Relations & Labor,NA,SAGE PUBLICATIONS LTD,2020-10-22 +transformation groups,1083-4362,1531-586X,NA,0,0,1,0,Mathematics,NA,NA,SPRINGER BIRKHAUSER,NA +transformations in business & economics,1648-4460,NA,NA,0,1,0,0,NA,Business | Economics,NA,VILNIUS UNIV,NA +transfusion,0041-1132,1537-2995,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +transfusion and apheresis science,1473-0502,1878-1683,NA,0,0,1,0,Hematology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transfusion clinique et biologique,1246-7820,1953-8022,NA,0,0,1,0,Hematology | Immunology,NA,NA,ELSEVIER FRANCE-EDITIONS SCIENTIFIQUES MEDICALES ELSEVIER,NA +transfusion medicine,0958-7578,1365-3148,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +transfusion medicine and hemotherapy,1660-3796,1660-3818,NA,0,0,1,0,Hematology | Immunology,NA,NA,KARGER,NA +transfusion medicine reviews,0887-7963,1532-9496,NA,0,0,1,0,Hematology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +transgender health,2688-4887,2380-193X,TransgenderHlth,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Psychology, Clinical | Social Sciences, Biomedical",NA,"MARY ANN LIEBERT, INC",2015-09-17 +transgender health,2688-4887,2380-193X,TransgenderHlth,0,1,1,1,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health | Psychology, Clinical | Social Sciences, Biomedical",NA,"MARY ANN LIEBERT, INC",2015-09-17 +transgenic research,0962-8819,1573-9368,NA,0,0,1,0,Biochemical Research Methods | Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology,NA,NA,SPRINGER,NA +transinformacao,0103-3786,2318-0889,TransInformacao,0,1,0,1,NA,Information Science & Library Science,NA,PONTIFICIA UNIVERSIDADE CATOLICA CAMPINAS,2020-11-16 +transition metal chemistry,0340-4285,1572-901X,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,SPRINGER,NA +translation and interpreting studies,1932-2798,1876-2700,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +translation and interpreting studies,1932-2798,1876-2700,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,JOHN BENJAMINS PUBLISHING CO,NA +translation and literature,0968-1361,1750-0214,NA,1,0,0,0,NA,NA,Literature,EDINBURGH UNIV PRESS,NA +translation review,0737-4836,2164-0564,NA,1,0,0,0,NA,NA,Literature | Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +translation studies,1478-1700,1751-2921,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +translation studies,1478-1700,1751-2921,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +translational andrology and urology,2223-4683,2223-4691,NA,0,0,1,0,Andrology | Urology & Nephrology,NA,NA,AME PUBL CO,NA +translational behavioral medicine,1869-6716,1613-9860,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +translational behavioral medicine,1869-6716,1613-9860,NA,0,1,1,0,"Public, Environmental & Occupational Health","Public, Environmental & Occupational Health",NA,OXFORD UNIV PRESS,NA +translational cancer research,2218-676X,2219-6803,NA,0,0,1,0,Oncology,NA,NA,AME PUBL CO,NA +translational lung cancer research,2218-6751,2226-4477,NA,0,0,1,0,Oncology | Respiratory System,NA,NA,AME PUBL CO,NA +translational neurodegeneration,2047-9158,2047-9158,NA,0,0,1,0,Neurosciences,NA,NA,BMC,NA +translational neuroscience,2081-3856,2081-6936,NA,0,0,1,0,Neurosciences,NA,NA,DE GRUYTER POLAND SP Z O O,NA +translational oncology,1936-5233,1936-5233,NA,0,0,1,0,Oncology,NA,NA,ELSEVIER SCIENCE INC,NA +translational pediatrics,2224-4336,2224-4344,NA,0,0,1,0,Pediatrics,NA,NA,AME PUBL CO,NA +translational psychiatry,2158-3188,2158-3188,Transl_Psych,0,0,1,1,Psychiatry,NA,NA,SPRINGERNATURE,2021-09-23 +translational research,1931-5244,1878-1810,NA,0,0,1,0,"Medical Laboratory Technology | Medicine, General & Internal | Medicine, Research & Experimental",NA,NA,ELSEVIER SCIENCE INC,NA +translational stroke research,1868-4483,1868-601X,NA,0,0,1,0,Clinical Neurology | Neurosciences,NA,NA,SPRINGER,NA +translational vision science & technology,2164-2591,2164-2591,NA,0,0,1,0,Ophthalmology,NA,NA,ASSOC RESEARCH VISION OPHTHALMOLOGY INC,NA +translator,1355-6509,1757-0409,the_translat0r,1,1,0,1,NA,Communication | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-09-20 +translator,1355-6509,1757-0409,the_translat0r,1,1,0,1,NA,Communication | Linguistics,Language & Linguistics,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-09-20 +transnational environmental law,2047-1025,2047-1033,teljournal,0,1,0,1,NA,Environmental Studies | Law,NA,CAMBRIDGE UNIV PRESS,2012-12-14 +transplant immunology,0966-3274,1878-5492,NA,0,0,1,0,Immunology | Transplantation,NA,NA,ELSEVIER,NA +transplant infectious disease,1398-2273,1399-3062,NA,0,0,1,0,Immunology | Infectious Diseases | Transplantation,NA,NA,WILEY,NA +transplant international,0934-0874,1432-2277,Transpl_Int,0,0,1,1,Surgery | Transplantation,NA,NA,WILEY,2015-02-14 +transplantation,0041-1337,1534-6080,TransplantJrnl,0,0,1,1,Immunology | Surgery | Transplantation,NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-08-01 +transplantation and cellular therapy,2666-6375,2666-6367,ASTCT_Journal,0,0,1,1,Hematology | Transplantation | Immunology,NA,NA,ELSEVIER SCIENCE INC,2020-04-09 +transplantation proceedings,0041-1345,1873-2623,NA,0,0,1,0,Immunology | Surgery | Transplantation,NA,NA,ELSEVIER SCIENCE INC,NA +transplantation reviews,0955-470X,1557-9816,NA,0,0,1,0,Immunology | Transplantation,NA,NA,ELSEVIER SCIENCE INC,NA +transport,1648-4142,1648-3480,NA,0,0,1,0,Transportation Science & Technology,NA,NA,VILNIUS GEDIMINAS TECH UNIV,NA +transport in porous media,0169-3913,1573-1634,NA,0,0,1,0,"Engineering, Chemical",NA,NA,SPRINGER,NA +transport policy,0967-070X,1879-310X,NA,0,1,0,0,NA,Economics | Transportation,NA,ELSEVIER SCI LTD,NA +transport reviews,0144-1647,1464-5327,TransptReviews,0,1,0,1,NA,Transportation,NA,TAYLOR & FRANCIS LTD,2016-05-27 +transportation,0049-4488,1572-9435,TransportJrnl,0,1,1,1,"Engineering, Civil | Transportation Science & Technology",Transportation,NA,SPRINGER,2021-01-29 +transportation,0049-4488,1572-9435,TransportJrnl,0,1,1,1,"Engineering, Civil | Transportation Science & Technology",Transportation,NA,SPRINGER,2021-01-29 +transportation geotechnics,2214-3912,2214-3912,NA,0,0,1,0,"Engineering, Civil | Engineering, Geological",NA,NA,ELSEVIER,NA +transportation journal,0041-1612,2157-328X,NA,0,1,0,0,NA,Management | Transportation,NA,PENN STATE UNIV PRESS,NA +transportation letters-the international journal of transportation research,1942-7867,1942-7875,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,TAYLOR & FRANCIS LTD,NA +transportation letters-the international journal of transportation research,1942-7867,1942-7875,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,TAYLOR & FRANCIS LTD,NA +transportation planning and technology,0308-1060,1029-0354,NA,0,0,1,0,Transportation Science & Technology,NA,NA,TAYLOR & FRANCIS LTD,NA +transportation research part a-policy and practice,0965-8564,1879-2375,NA,0,1,1,0,Transportation Science & Technology,Economics | Transportation,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part a-policy and practice,0965-8564,1879-2375,NA,0,1,1,0,Transportation Science & Technology,Economics | Transportation,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part b-methodological,0191-2615,1879-2367,NA,0,1,1,0,"Engineering, Civil | Operations Research & Management Science | Transportation Science & Technology",Economics | Transportation,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part b-methodological,0191-2615,1879-2367,NA,0,1,1,0,"Engineering, Civil | Operations Research & Management Science | Transportation Science & Technology",Economics | Transportation,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part c-emerging technologies,0968-090X,1879-2359,NA,0,0,1,0,Transportation Science & Technology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part d-transport and environment,1361-9209,1879-2340,NA,0,1,1,0,Transportation Science & Technology,Environmental Studies | Transportation,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part d-transport and environment,1361-9209,1879-2340,NA,0,1,1,0,Transportation Science & Technology,Environmental Studies | Transportation,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part e-logistics and transportation review,1366-5545,1878-5794,NA,0,1,1,0,"Engineering, Civil | Operations Research & Management Science | Transportation Science & Technology",Economics | Transportation,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part e-logistics and transportation review,1366-5545,1878-5794,NA,0,1,1,0,"Engineering, Civil | Operations Research & Management Science | Transportation Science & Technology",Economics | Transportation,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +transportation research part f-traffic psychology and behaviour,1369-8478,1873-5517,NA,0,1,0,0,NA,"Psychology, Applied | Transportation",NA,ELSEVIER SCI LTD,NA +transportation research record,0361-1981,2169-4052,NA,0,0,1,0,"Engineering, Civil | Transportation Science & Technology",NA,NA,SAGE PUBLICATIONS INC,NA +transportation science,0041-1655,0041-1655,TranSciJournal,0,1,1,1,Operations Research & Management Science | Transportation Science & Technology,Transportation,NA,INFORMS,2022-03-09 +transportation science,0041-1655,0041-1655,TranSciJournal,0,1,1,1,Operations Research & Management Science | Transportation Science & Technology,Transportation,NA,INFORMS,2022-03-09 +transportmetrica a-transport science,2324-9935,2324-9943,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,TAYLOR & FRANCIS LTD,NA +transportmetrica a-transport science,2324-9935,2324-9943,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,TAYLOR & FRANCIS LTD,NA +transportmetrica b-transport dynamics,2168-0566,2168-0582,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,TAYLOR & FRANCIS LTD,NA +transportmetrica b-transport dynamics,2168-0566,2168-0582,NA,0,1,1,0,Transportation Science & Technology,Transportation,NA,TAYLOR & FRANCIS LTD,NA +transylvanian review,1221-1249,1221-1249,NA,1,0,0,0,NA,NA,History,CENTER TRANSYLVANIAN STUDIES,NA +transylvanian review of administrative sciences,1842-2845,2247-8310,NA,0,1,0,0,NA,Public Administration,NA,BABES-BOLYAI UNIV,NA +trauma violence & abuse,1524-8380,1552-8324,NA,0,1,0,0,NA,Criminology & Penology | Family Studies | Social Work,NA,SAGE PUBLICATIONS INC,NA +travail genre et societes,1294-6303,1294-6303,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary | Women'S Studies",NA,EDITIONS LA DECOUVERTE,NA +travail humain,0041-1868,2104-3663,NA,0,1,1,0,"Engineering, Industrial | Psychology","Ergonomics | Psychology, Applied",NA,PRESSES UNIV FRANCE,NA +travail humain,0041-1868,2104-3663,NA,0,1,1,0,"Engineering, Industrial | Psychology","Ergonomics | Psychology, Applied",NA,PRESSES UNIV FRANCE,NA +travel behaviour and society,2214-367X,2214-3688,NA,0,1,0,0,NA,Transportation,NA,ELSEVIER,NA +travel medicine and infectious disease,1477-8939,1873-0442,NA,0,0,1,0,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,ELSEVIER SCI LTD,NA +tree-ring research,1536-1098,2162-4585,NA,0,0,1,0,Forestry,NA,NA,TREE-RING SOC,NA +tree genetics & genomes,1614-2942,1614-2950,NA,0,0,1,0,Forestry | Genetics & Heredity | Horticulture,NA,NA,SPRINGER HEIDELBERG,NA +tree physiology,0829-318X,1758-4469,NA,0,0,1,0,Forestry,NA,NA,OXFORD UNIV PRESS,NA +trees-structure and function,0931-1890,1432-2285,NA,0,0,1,0,Forestry,NA,NA,SPRINGER HEIDELBERG,NA +trends in biochemical sciences,0968-0004,1362-4326,TrendsBiochem,0,0,1,1,Biochemistry & Molecular Biology,NA,NA,ELSEVIER SCIENCE LONDON,2013-02-19 +trends in biotechnology,0167-7799,1879-3096,TrendsinBiotech,0,0,1,1,Biotechnology & Applied Microbiology,NA,NA,ELSEVIER SCIENCE LONDON,2012-06-06 +trends in cancer,2405-8025,2405-8033,trendscancer,0,0,1,1,Oncology,NA,NA,CELL PRESS,2015-09-03 +trends in cardiovascular medicine,1050-1738,1873-2615,NA,0,0,1,0,Cardiac & Cardiovascular System,NA,NA,ELSEVIER SCIENCE LONDON,NA +trends in cell biology,0962-8924,1879-3088,TrendsCellBio,0,0,1,1,Cell Biology,NA,NA,ELSEVIER SCIENCE LONDON,2014-07-28 +trends in chemistry,2589-7209,2589-5974,TrendsChemistry,0,0,1,1,"Chemistry, Multidisciplinary",NA,NA,ELSEVIER,2018-11-09 +trends in classics,1866-7473,1866-7481,NA,1,0,0,0,NA,NA,Classics,WALTER DE GRUYTER GMBH,NA +trends in cognitive sciences,1364-6613,1879-307X,TrendsCognSci,0,1,1,1,Behavioral Sciences | Neurosciences,"Psychology, Experimental",NA,ELSEVIER SCIENCE LONDON,2011-02-01 +trends in cognitive sciences,1364-6613,1879-307X,TrendsCognSci,0,1,1,1,Behavioral Sciences | Neurosciences,"Psychology, Experimental",NA,ELSEVIER SCIENCE LONDON,2011-02-01 +trends in ecology & evolution,0169-5347,1872-8383,Trends_Ecol_Evo,0,0,1,1,Ecology | Evolutionary Biology | Genetics & Heredity,NA,NA,ELSEVIER SCIENCE LONDON,2011-06-04 +trends in endocrinology and metabolism,1043-2760,1879-3061,Trends_Endo_Met,0,0,1,1,Endocrinology & Metabolism,NA,NA,ELSEVIER SCIENCE LONDON,2009-04-04 +trends in environmental analytical chemistry,2214-1588,2214-1588,NA,0,0,1,0,"Chemistry, Analytical | Environmental Sciences",NA,NA,ELSEVIER,NA +trends in food science & technology,0924-2244,1879-3053,NA,0,0,1,0,Food Science & Technology,NA,NA,ELSEVIER SCIENCE LONDON,NA +trends in genetics,0168-9525,1362-4555,TrendsGenetics,0,0,1,1,Genetics & Heredity,NA,NA,ELSEVIER SCIENCE LONDON,2012-10-22 +trends in glycoscience and glycotechnology,0915-7352,1883-2113,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,GAKUSHIN PUBL CO,NA +trends in hearing,2331-2165,2331-2165,NA,0,0,1,0,Audiology & Speech-Language Pathology | Otorhinolaryngology,NA,NA,SAGE PUBLICATIONS INC,NA +trends in immunology,1471-4906,1471-4981,TrendsImmuno,0,0,1,1,Immunology,NA,NA,ELSEVIER SCI LTD,2016-07-26 +trends in microbiology,0966-842X,1878-4380,TrendsMicrobiol,0,0,1,1,Biochemistry & Molecular Biology | Microbiology,NA,NA,ELSEVIER SCI LTD,2011-04-05 +trends in molecular medicine,1471-4914,1471-499X,TrendsMolecMed,0,0,1,1,"Biochemistry & Molecular Biology | Cell Biology | Medicine, Research & Experimental",NA,NA,ELSEVIER SCI LTD,2011-04-29 +trends in neurosciences,0166-2236,1878-108X,TrendsNeuro,0,0,1,1,Neurosciences,NA,NA,ELSEVIER SCIENCE LONDON,2016-10-02 +trends in organized crime,1084-4791,1936-4830,NA,0,1,0,0,NA,Criminology & Penology,NA,SPRINGER,NA +trends in parasitology,1471-4922,1471-5007,TrendsParasitol,0,0,1,1,Parasitology,NA,NA,ELSEVIER SCI LTD,2011-10-25 +trends in pharmacological sciences,0165-6147,1873-3735,TrendsinPharma,0,0,1,1,Pharmacology & Pharmacy,NA,NA,ELSEVIER SCIENCE LONDON,2011-02-28 +trends in plant science,1360-1385,1878-4372,TrendsPlantSci,0,0,1,1,Plant Sciences,NA,NA,ELSEVIER SCIENCE LONDON,2011-03-25 +trials,1745-6215,1745-6215,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,BMC,NA +tribology international,0301-679X,1879-2464,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,ELSEVIER SCI LTD,NA +tribology letters,1023-8883,1573-2711,TribologyLett,0,0,1,1,"Engineering, Chemical | Engineering, Mechanical",NA,NA,SPRINGER/PLENUM PUBLISHERS,2021-05-14 +tribology transactions,1040-2004,1547-397X,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,TAYLOR & FRANCIS INC,NA +trimestre economico,0041-3011,0041-3011,NA,0,1,0,0,NA,Economics,NA,FONDO CULTURA ECONOMICA,NA +tropical animal health and production,0049-4747,1573-7438,NA,0,0,1,0,"Agriculture, Dairy & Animal Science | Veterinary Sciences",NA,NA,SPRINGER,NA +tropical biomedicine,0127-5720,2521-9855,NA,0,0,1,0,Parasitology | Tropical Medicine,NA,NA,MALAYSIAN SOC PARASITOLOGY TROPICAL MEDICINE,NA +tropical conservation science,1940-0829,1940-0829,TropicalConSci,0,0,1,1,Biodiversity Conservation,NA,NA,SAGE PUBLICATIONS INC,2019-02-04 +tropical doctor,0049-4755,1758-1133,NA,0,0,1,0,"Public, Environmental & Occupational Health | Tropical Medicine",NA,NA,SAGE PUBLICATIONS INC,NA +tropical ecology,0564-3295,2661-8982,NA,0,0,1,0,Ecology,NA,NA,SCIENTIFIC PUBLISHERS,NA +tropical grasslands-forrajes tropicales,2346-3775,2346-3775,tgftjournal,0,0,1,1,"Agriculture, Dairy & Animal Science | Agronomy",NA,NA,CENTRO INT AGRICULTURA TROPICAL-CIAT,NA +tropical journal of pharmaceutical research,1596-5996,1596-9827,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,PHARMACOTHERAPY GROUP,NA +tropical medicine & international health,1360-2276,1365-3156,NA,0,0,1,0,"Public, Environmental & Occupational Health | Tropical Medicine",NA,NA,WILEY,NA +tropical plant biology,1935-9756,1935-9764,NA,0,0,1,0,Plant Sciences,NA,NA,SPRINGER,NA +tropical plant pathology,1983-2052,1983-2052,TropPlantPathol,0,0,1,1,Plant Sciences,NA,NA,SPRINGER,2015-04-09 +tropical zoology,0394-6975,1970-9528,TropicalZoology,0,0,1,1,Zoology,NA,NA,PAGEPRESS PUBL,2020-12-28 +tsinghua science and technology,1007-0214,1878-7606,TST_Journal,0,0,1,1,"Computer Science, Information Systems | Computer Science, Software Engineering | Engineering, Electrical & Electronic",NA,NA,TSINGHUA UNIV PRESS,2019-06-20 +tuberculosis,1472-9792,1873-281X,NA,0,0,1,0,Immunology | Microbiology | Respiratory System,NA,NA,CHURCHILL LIVINGSTONE,NA +tuexenia,0722-494X,0722-494X,NA,0,0,1,0,Plant Sciences,NA,NA,FLORISTISCH-SOZIOLOGISCHEN ARBEITSGEMEINSCHAFT E V,NA +tulsa studies in womens literature,0732-7730,1936-1645,TSWLjournal,1,0,0,1,NA,NA,Literature,UNIV TULSA,2012-01-25 +tumori journal,0300-8916,2038-2529,TumoriJ,0,0,1,1,Oncology,NA,NA,SAGE PUBLICATIONS LTD,2021-02-08 +tuna-ajalookultuuri ajakiri,1406-4030,NA,NA,1,0,0,0,NA,NA,History,RAHVUSARHIV-NATL ARCH ESTONIA,NA +tunnelling and underground space technology,0886-7798,1878-4364,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +turk gogus kalp damar cerrahisi dergisi-turkish journal of thoracic and cardiovascular surgery,1301-5680,1301-5680,NA,0,0,1,0,Surgery,NA,NA,BAYCINAR MEDICAL PUBL-BAYCINAR TIBBI YAYINCILIK,NA +turk psikiyatri dergisi,1300-2163,1300-2163,NA,0,1,0,0,NA,Psychiatry,NA,TURKIYE SINIR VE RUH SAGLIGI DERNEGI,NA +turk psikoloji dergisi,1300-4433,1300-4433,turk_dergisi,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,TURKISH PSYCHOLOGISTS ASSOC,NA +turkic languages,1431-4983,1431-4983,NA,1,0,0,0,NA,NA,Language & Linguistics | Asian Studies,HARRASSOWITZ VERLAG,NA +turkish historical review,1877-5454,1877-5462,NA,1,0,0,0,NA,NA,History,BRILL,NA +turkish journal of agriculture and forestry,1300-011X,1303-6173,NA,0,0,1,0,Agronomy,NA,NA,TUBITAK SCIENTIFIC & TECHNICAL RESEARCH COUNCIL TURKEY,NA +turkish journal of biochemistry-turk biyokimya dergisi,0250-4685,1303-829X,NA,0,0,1,0,Biochemistry & Molecular Biology,NA,NA,WALTER DE GRUYTER GMBH,NA +turkish journal of biology,1300-0152,1303-6092,TurkJBiology,0,0,1,1,Biology,NA,NA,TUBITAK SCIENTIFIC & TECHNICAL RESEARCH COUNCIL TURKEY,NA +turkish journal of botany,1300-008X,1303-6106,NA,0,0,1,0,Plant Sciences,NA,NA,TUBITAK SCIENTIFIC & TECHNICAL RESEARCH COUNCIL TURKEY,NA +turkish journal of chemistry,1300-0527,1300-0527,NA,0,0,1,0,"Chemistry, Multidisciplinary | Engineering, Chemical",NA,NA,SCIENTIFIC TECHNICAL RESEARCH COUNCIL TURKEY-TUBITAK,NA +turkish journal of earth sciences,1300-0985,1300-0985,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,SCIENTIFIC TECHNICAL RESEARCH COUNCIL TURKEY-TUBITAK,NA +turkish journal of electrical engineering and computer sciences,1300-0632,1303-6203,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Engineering, Electrical & Electronic",NA,NA,TUBITAK SCIENTIFIC & TECHNICAL RESEARCH COUNCIL TURKEY,NA +turkish journal of field crops,1301-1111,1301-1111,NA,0,0,1,0,Agronomy,NA,NA,SOC FIELD CROP SCI,NA +turkish journal of fisheries and aquatic sciences,1303-2712,2149-181X,NA,0,0,1,0,Fisheries | Marine & Freshwater Biology,NA,NA,CENTRAL FISHERIES RESEARCH INST,NA +turkish journal of gastroenterology,1300-4948,2148-5607,TJGastroenterol,0,0,1,1,Gastroenterology & Hepatology,NA,NA,AVES,2022-04-14 +turkish journal of geriatrics-turk geriatri dergisi,1304-2947,1307-9948,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,GUNES KITABEVI LTD STI,NA +turkish journal of geriatrics-turk geriatri dergisi,1304-2947,1307-9948,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,GUNES KITABEVI LTD STI,NA +turkish journal of hematology,1300-7777,1308-5263,NA,0,0,1,0,Hematology,NA,NA,GALENOS YAYINCILIK,NA +turkish journal of mathematics,1300-0098,1303-6149,NA,0,0,1,0,Mathematics,NA,NA,SCIENTIFIC TECHNICAL RESEARCH COUNCIL TURKEY-TUBITAK,NA +turkish journal of medical sciences,1300-0144,1303-6165,TurkJMedSci,0,0,1,1,"Medicine, General & Internal",NA,NA,TUBITAK SCIENTIFIC & TECHNICAL RESEARCH COUNCIL TURKEY,NA +turkish journal of pediatrics,0041-4301,0041-4301,NA,0,0,1,0,Pediatrics,NA,NA,TURKISH J PEDIATRICS,NA +turkish journal of physical medicine and rehabilitation,2587-0823,2587-1250,NA,0,0,1,0,Rehabilitation,NA,NA,BAYCINAR MEDICAL PUBL-BAYCINAR TIBBI YAYINCILIK,NA +turkish journal of veterinary & animal sciences,1300-0128,1300-0128,NA,0,0,1,0,Veterinary Sciences,NA,NA,SCIENTIFIC TECHNICAL RESEARCH COUNCIL TURKEY-TUBITAK,NA +turkish journal of zoology,1300-0179,1303-6114,NA,0,0,1,0,Zoology,NA,NA,TUBITAK SCIENTIFIC & TECHNICAL RESEARCH COUNCIL TURKEY,NA +turkish neurosurgery,1019-5149,1019-5149,turkneurosurger,0,0,1,1,Clinical Neurology | Surgery,NA,NA,TURKISH NEUROSURGICAL SOC,NA +turkish studies,1468-3849,1743-9663,NA,0,1,0,0,NA,Area Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +turkiye entomoloji dergisi-turkish journal of entomology,1010-6960,NA,NA,0,0,1,0,Entomology,NA,NA,"ENTOMOLOGICAL SOC TURKEY, EGE UNIV",NA +twentieth-century music,1478-5722,1478-5730,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +twentieth century british history,0955-2359,1477-4674,TCBHJournal,1,0,0,1,NA,NA,History,OXFORD UNIV PRESS,2014-08-05 +twentieth century literature,0041-462X,2325-8101,NA,1,0,0,0,NA,NA,Literature,HOFSTRA UNIV PRESS,NA +twin research and human genetics,1832-4274,1839-2628,NA,0,0,1,0,Genetics & Heredity | Obstetrics & Gynecology,NA,NA,CAMBRIDGE UNIV PRESS,NA +twms journal of pure and applied mathematics,2076-2585,2219-1259,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,INST APPLIED MATHEMATICS,NA +tydskrif vir geesteswetenskappe,0041-4751,2224-7912,NA,0,1,0,0,NA,Social Issues,NA,"SUID-AFRIKAANSE AKAD VIR WETENSKAP EN KUNS, SEKRETARIS",NA +tydskrif vir letterkunde,0041-476X,2309-9070,tydskrif1936,1,0,0,1,NA,NA,Literature,UNIV PRETORIA,2015-11-26 +tyndale bulletin,0082-7118,0082-7118,TyndaleBulletin,1,0,0,1,NA,NA,Religion,TYNDALE HOUSE,2021-04-21 +ucla law review,0041-5650,1943-1724,UCLALawReview,0,1,0,1,NA,Law,NA,UNIV CALIF,2009-10-12 +uhod-uluslararasi hematoloji-onkoloji dergisi,1306-133X,1306-133X,NA,0,0,1,0,Oncology,NA,NA,AKAD DOKTORLAR YAYINEVI,NA +ukrainian journal of physical optics,1609-1833,NA,NA,0,0,1,0,Optics,NA,NA,INST PHYSICAL OPTICS,NA +ukrainian mathematical journal,0041-5995,1573-9376,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,SPRINGER,NA +ultramicroscopy,0304-3991,1879-2723,NA,0,0,1,0,Microscopy,NA,NA,ELSEVIER,NA +ultraschall in der medizin,0172-4614,1438-8782,NA,0,0,1,0,"Acoustics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,GEORG THIEME VERLAG KG,NA +ultrasonic imaging,0161-7346,1096-0910,NA,0,0,1,0,"Acoustics | Engineering, Biomedical | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,SAGE PUBLICATIONS INC,NA +ultrasonics,0041-624X,1874-9968,NA,0,0,1,0,"Acoustics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER,NA +ultrasonics sonochemistry,1350-4177,1873-2828,NA,0,0,1,0,"Acoustics | Chemistry, Multidisciplinary",NA,NA,ELSEVIER,NA +ultrasonography,2288-5919,2288-5943,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,KOREAN SOC ULTRASOUND MEDICINE,NA +ultrasound in medicine and biology,0301-5629,1879-291X,NA,0,0,1,0,"Acoustics | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER SCIENCE INC,NA +ultrasound in obstetrics & gynecology,0960-7692,1469-0705,NA,0,0,1,0,"Acoustics | Obstetrics & Gynecology | Radiology, Nuclear Medicine & Medical Imaging",NA,NA,WILEY,NA +ultrasound quarterly,0894-8771,1536-0253,UltrasoundQtrly,0,0,1,1,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,LIPPINCOTT WILLIAMS & WILKINS,2011-10-14 +ultrastructural pathology,0191-3123,1521-0758,NA,0,0,1,0,Microscopy | Pathology,NA,NA,TAYLOR & FRANCIS INC,NA +ulusal travma ve acil cerrahi dergisi-turkish journal of trauma & emergency surgery,1306-696X,1307-7945,NA,0,0,1,0,Emergency Medicine,NA,NA,TURKISH ASSOC TRAUMA EMERGENCY SURGERY,NA +uluslararasi iliskiler-international relations,1304-7310,1304-7175,NA,0,1,0,0,NA,International Relations,NA,ULUSLARARASI ILISKILER KONSEYI DERNEGI,NA +umeni-art,0049-5123,1804-6509,NA,1,0,0,0,NA,NA,Art,INST ART HIST ACAD SCI CZECH REPUBLIC,NA +underground space,2096-2754,2467-9674,NA,0,0,1,0,"Engineering, Civil",NA,NA,KEAI PUBLISHING LTD,NA +undersea and hyperbaric medicine,1066-2936,NA,NA,0,0,1,0,"Marine & Freshwater Biology | Medicine, Research & Experimental",NA,NA,UNDERSEA & HYPERBARIC MEDICAL SOC INC,NA +unfallchirurg,0177-5537,1433-044X,NA,0,0,1,0,Emergency Medicine | Surgery,NA,NA,SPRINGER,NA +united european gastroenterology journal,2050-6406,2050-6414,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,JOHN WILEY & SONS LTD,NA +universal access in the information society,1615-5289,1615-5297,NA,0,1,1,0,"Computer Science, Cybernetics",Ergonomics,NA,SPRINGER HEIDELBERG,NA +universal access in the information society,1615-5289,1615-5297,NA,0,1,1,0,"Computer Science, Cybernetics",Ergonomics,NA,SPRINGER HEIDELBERG,NA +universe,2218-1997,2218-1997,Universe_MDPI,0,0,1,1,"Astronomy & Astrophysics | Physics, Particles & Fields",NA,NA,MDPI,2016-10-13 +universitas-monthly review of philosophy and culture,1015-8383,1015-8383,NA,1,0,0,0,NA,NA,Philosophy,UNIVERSITAS,NA +universitas psychologica,1657-9267,2011-2777,UniversitasPsyc,0,1,0,1,NA,"Psychology, Multidisciplinary",NA,"PONTIFICA UNIV JAVERIANA, FAC PSYCH",2009-06-10 +university of chicago law review,0041-9494,NA,uchilrev,0,1,0,1,NA,Law,NA,UNIV CHICAGO LAW SCH,2012-01-28 +university of cincinnati law review,0009-6881,1942-8391,ucinlawreview,0,1,0,1,NA,Law,NA,UNIV CINCINNATI LAW REVIEW,2018-03-20 +university of illinois law review,0276-9948,1942-9231,uilllrev,0,1,0,1,NA,Law,NA,UNIV ILLINOIS,2012-04-03 +university of pennsylvania journal of international law,1938-0283,NA,NA,0,1,0,0,NA,Law,NA,UNIV PENN LAW SCH,NA +university of pennsylvania law review,0041-9907,NA,pennlrev,0,1,0,1,NA,Law,NA,UNIV PENN LAW SCH,2012-11-02 +university of pittsburgh law review,0041-9915,1942-8405,pittlawreview,0,1,0,1,NA,Law,NA,"UNIV PITTSBURGH, UNIV LIBRARY SYSTEM",2014-05-17 +university of toronto law journal,0042-0220,1710-1174,NA,0,1,0,0,NA,Law,NA,UNIV TORONTO PRESS INC,NA +university of toronto quarterly,0042-0247,1712-5278,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",UNIV TORONTO PRESS INC,NA +university politehnica of bucharest scientific bulletin-series a-applied mathematics and physics,1223-7027,NA,NA,0,0,1,0,"Mathematics, Applied | Physics, Multidisciplinary",NA,NA,"UNIV POLITEHNICA BUCHAREST, SCI BULL",NA +updates in surgery,2038-131X,2038-3312,UpdatesSurgery,0,0,1,1,Surgery,NA,NA,SPRINGER-VERLAG ITALIA SRL,2019-08-07 +upsala journal of medical sciences,0300-9734,2000-1967,UpsJMedSci,0,0,1,1,"Medicine, General & Internal",NA,NA,UPSALA MED SOC,2019-09-24 +urban affairs review,1078-0874,1552-8332,UrbanAffairsRev,0,1,0,1,NA,Urban Studies,NA,SAGE PUBLICATIONS INC,2015-09-15 +urban climate,2212-0955,2212-0955,NA,0,0,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences,NA,NA,ELSEVIER,NA +urban design international,1357-5317,1468-4519,NA,1,1,0,0,NA,Regional & Urban Planning | Urban Studies,Architecture,PALGRAVE MACMILLAN LTD,NA +urban design international,1357-5317,1468-4519,NA,1,1,0,0,NA,Regional & Urban Planning | Urban Studies,Architecture,PALGRAVE MACMILLAN LTD,NA +urban ecosystems,1083-8155,1573-1642,NA,0,0,1,0,Biodiversity Conservation | Ecology,NA,NA,SPRINGER,NA +urban education,0042-0859,1552-8340,UrbanEdJournal,0,1,0,1,NA,Education & Educational Research | Urban Studies,NA,SAGE PUBLICATIONS INC,2012-04-10 +urban forestry & urban greening,1618-8667,1610-8167,NA,0,1,1,0,Forestry,Environmental Studies | Urban Studies,NA,ELSEVIER GMBH,NA +urban forestry & urban greening,1618-8667,1610-8167,NA,0,1,1,0,Forestry,Environmental Studies | Urban Studies,NA,ELSEVIER GMBH,NA +urban geography,0272-3638,1938-2847,urbgeog,0,1,0,1,NA,Geography | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-07-04 +urban history,0963-9268,1469-8706,UrbanHistoryCUP,1,0,0,1,NA,NA,History,CAMBRIDGE UNIV PRESS,2014-04-28 +urban history review-revue d histoire urbaine,0703-0428,1918-5138,UrbanHistoryCan,1,0,0,1,NA,NA,History,UNIV TORONTO PRESS INC,2014-03-02 +urban lawyer,0042-0905,NA,NA,0,1,0,0,NA,Law | Urban Studies,NA,"AMER BAR ASSOC, ADMINISTRATIVE LAW & REGULATORY PRACTICE SECTION",NA +urban morphology,1027-4278,1027-4278,NA,1,0,0,0,NA,NA,Architecture,INT SEMINAR URBAN FORM,NA +urban policy and research,0811-1146,1476-7244,uprjournal,0,1,0,1,NA,Environmental Studies | Geography | Regional & Urban Planning | Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-08-31 +urban research & practice,1753-5069,1753-5077,NA,0,1,0,0,NA,Urban Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +urban studies,0042-0980,1360-063X,USJ_online,0,1,0,1,NA,Environmental Studies | Urban Studies,NA,SAGE PUBLICATIONS LTD,2016-03-03 +urban water journal,1573-062X,1744-9006,NA,0,0,1,0,Water Resources,NA,NA,TAYLOR & FRANCIS LTD,NA +urolithiasis,2194-7228,2194-7236,NA,0,0,1,0,Urology & Nephrology,NA,NA,SPRINGER,NA +urologe,0340-2592,1433-0563,NA,0,0,1,0,Urology & Nephrology,NA,NA,SPRINGER HEIDELBERG,NA +urologia internationalis,0042-1138,1423-0399,NA,0,0,1,0,Urology & Nephrology,NA,NA,KARGER,NA +urologic clinics of north america,0094-0143,1558-318X,NA,0,0,1,0,Urology & Nephrology,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +urologic oncology-seminars and original investigations,1078-1439,1873-2496,UrolOncol,0,0,1,1,Oncology | Urology & Nephrology,NA,NA,ELSEVIER SCIENCE INC,2020-05-14 +urology,0090-4295,1527-9995,NA,0,0,1,0,Urology & Nephrology,NA,NA,ELSEVIER SCIENCE INC,NA +urology journal,1735-1308,1735-546X,NA,0,0,1,0,Urology & Nephrology,NA,NA,UROL & NEPHROL RES CTR-UNRC,NA +ursus,1537-6176,1938-5439,NA,0,0,1,0,Zoology,NA,NA,INT ASSOC BEAR RESEARCH & MANAGEMENT-IBA,NA +user modeling and user-adapted interaction,0924-1868,1573-1391,NA,0,0,1,0,"Computer Science, Cybernetics",NA,NA,SPRINGER,NA +utilitas,0953-8208,1741-6183,NA,1,0,0,0,NA,NA,Philosophy,CAMBRIDGE UNIV PRESS,NA +utilities policy,0957-1787,1878-4356,NA,0,1,1,0,Energy & Fuels | Environmental Sciences,Environmental Studies,NA,ELSEVIER SCI LTD,NA +utilities policy,0957-1787,1878-4356,NA,0,1,1,0,Energy & Fuels | Environmental Sciences,Environmental Studies,NA,ELSEVIER SCI LTD,NA +utopian studies,1045-991X,2154-9648,UtopianSJournal,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",PENN STATE UNIV PRESS,2014-11-01 +vaccine,0264-410X,1873-2518,NA,0,0,1,0,"Immunology | Medicine, Research & Experimental",NA,NA,ELSEVIER SCI LTD,NA +vaccines,2076-393X,2076-393X,Vaccines_MDPI,0,0,1,1,"Immunology | Medicine, Research & Experimental",NA,NA,MDPI,2017-08-11 +vacuum,0042-207X,1879-2715,NA,0,0,1,0,"Materials Science, Multidisciplinary | Physics, Applied",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +vadose zone journal,1539-1663,1539-1663,vadosezonej,0,0,1,1,Environmental Sciences | Soil Science | Water Resources,NA,NA,WILEY,2015-01-22 +value in health,1098-3015,1524-4733,NA,0,1,1,0,Health Care Sciences & Services,Economics | Health Policy & Services,NA,ELSEVIER SCIENCE INC,NA +value in health,1098-3015,1524-4733,NA,0,1,1,0,Health Care Sciences & Services,Economics | Health Policy & Services,NA,ELSEVIER SCIENCE INC,NA +vanderbilt law review,0042-2533,1942-9886,vandlrev,0,1,0,1,NA,Law,NA,VANDERBILT LAW REVIEW,2016-08-25 +vasa-european journal of vascular medicine,0301-1526,1664-2872,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,HOGREFE AG-HOGREFE AG SUISSE,NA +vascular,1708-5381,1708-539X,NA,0,0,1,0,Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS LTD,NA +vascular and endovascular surgery,1538-5744,1938-9116,NA,0,0,1,0,Surgery | Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS INC,NA +vascular medicine,1358-863X,1477-0377,VMJ_SVM,0,0,1,1,Peripheral Vascular Diseases,NA,NA,SAGE PUBLICATIONS LTD,2014-10-13 +vascular pharmacology,1537-1891,1879-3649,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,ELSEVIER SCIENCE INC,NA +vector-borne and zoonotic diseases,1530-3667,1557-7759,NA,0,0,1,0,"Public, Environmental & Occupational Health | Infectious Diseases",NA,NA,"MARY ANN LIEBERT, INC",NA +vegetation history and archaeobotany,0939-6314,1617-6278,NA,0,0,1,0,Plant Sciences | Paleontology,NA,NA,SPRINGER,NA +vehicle system dynamics,0042-3114,1744-5159,NA,0,0,1,0,"Engineering, Mechanical",NA,NA,TAYLOR & FRANCIS LTD,NA +vehicular communications,2214-2096,2214-2096,NA,0,0,1,0,Telecommunications | Transportation Science & Technology,NA,NA,ELSEVIER,NA +venture capital,1369-1066,1464-5343,VCJournal,0,1,0,1,NA,"Business, Finance",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2009-09-02 +verbum,1585-079X,1588-4309,NA,1,0,0,0,NA,NA,"History | Literature, Romance | Language & Linguistics","PAZMANY PETER CATHOLIC UNIV, FACULTY HUMANITES",NA +verhaltenstherapie,1016-6262,1423-0402,NA,0,1,1,0,Psychiatry,"Psychology, Clinical",NA,KARGER,NA +verhaltenstherapie,1016-6262,1423-0402,NA,0,1,1,0,Psychiatry,"Psychology, Clinical",NA,KARGER,NA +verifiche,0391-4186,NA,verifiche,1,0,0,1,NA,NA,Philosophy,ASSOC TRENTINA SCI UMANE,2011-08-22 +vernacular architecture,0305-5477,1749-6292,NA,1,0,0,0,NA,NA,Architecture,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +vertebrate zoology,1864-5755,2625-8498,NA,0,0,1,0,Zoology,NA,NA,STAATLICHES MUSEUM TIERKUNDE DRESDEN,NA +veterinaria italiana,0505-401X,1828-1427,NA,0,0,1,0,Veterinary Sciences,NA,NA,IST ZOOPROFILATTICO SPERIMENTALE ABRUZZO & MOLISE G CAPORALE-IZS A&M,NA +veterinaria mexico,0301-5092,2448-6760,NA,0,0,1,0,Veterinary Sciences,NA,NA,UNIV NACIONAL AUTONOMA MEXICO FACULTAD MEDICINA VETERINARIA ZOOTECNIA,NA +veterinarni medicina,0375-8427,1805-9392,NA,0,0,1,0,Veterinary Sciences,NA,NA,CZECH ACADEMY AGRICULTURAL SCIENCES,NA +veterinarski arhiv,0372-5480,1331-8055,NA,0,0,1,0,Veterinary Sciences,NA,NA,UNIV ZAGREB VET FACULTY,NA +veterinary anaesthesia and analgesia,1467-2987,1467-2995,NA,0,0,1,0,Veterinary Sciences,NA,NA,ELSEVIER,NA +veterinary and comparative oncology,1476-5810,1476-5829,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +veterinary and comparative orthopaedics and traumatology,0932-0814,2567-6911,NA,0,0,1,0,Veterinary Sciences | Zoology,NA,NA,GEORG THIEME VERLAG KG,NA +veterinary clinical pathology,0275-6382,1939-165X,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +veterinary clinics of north america-equine practice,0749-0739,1558-4224,NA,0,0,1,0,Veterinary Sciences,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +veterinary clinics of north america-food animal practice,0749-0720,1558-4240,NA,0,0,1,0,Veterinary Sciences,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +veterinary clinics of north america-small animal practice,0195-5616,1878-1306,NA,0,0,1,0,Veterinary Sciences,NA,NA,W B SAUNDERS CO-ELSEVIER INC,NA +veterinary dermatology,0959-4493,1365-3164,NA,0,0,1,0,Dermatology | Veterinary Sciences,NA,NA,WILEY,NA +veterinary immunology and immunopathology,0165-2427,1873-2534,NA,0,0,1,0,Immunology | Veterinary Sciences,NA,NA,ELSEVIER,NA +veterinary journal,1090-0233,1532-2971,NA,0,0,1,0,Veterinary Sciences,NA,NA,ELSEVIER SCI LTD,NA +veterinary medicine and science,2053-1095,2053-1095,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +veterinary microbiology,0378-1135,1873-2542,NA,0,0,1,0,Microbiology | Veterinary Sciences,NA,NA,ELSEVIER,NA +veterinary ophthalmology,1463-5216,1463-5224,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +veterinary parasitology,0304-4017,1873-2550,NA,0,0,1,0,Parasitology | Veterinary Sciences,NA,NA,ELSEVIER,NA +veterinary pathology,0300-9858,1544-2217,NA,0,0,1,0,Pathology | Veterinary Sciences,NA,NA,SAGE PUBLICATIONS INC,NA +veterinary quarterly,0165-2176,1875-5941,NA,0,0,1,0,Veterinary Sciences,NA,NA,TAYLOR & FRANCIS LTD,NA +veterinary radiology & ultrasound,1058-8183,1740-8261,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +veterinary record,0042-4900,2042-7670,Vet_Record,0,0,1,1,Veterinary Sciences,NA,NA,WILEY,2010-07-19 +veterinary research,0928-4249,1297-9716,NA,0,0,1,0,Veterinary Sciences,NA,NA,BMC,NA +veterinary research communications,0165-7380,1573-7446,NA,0,0,1,0,Veterinary Sciences,NA,NA,SPRINGER,NA +veterinary research forum,2008-8140,2322-3618,NA,0,0,1,0,Zoology,NA,NA,URMIA UNIV,NA +veterinary sciences,2306-7381,2306-7381,NA,0,0,1,0,Veterinary Sciences,NA,NA,MDPI,NA +veterinary surgery,0161-3499,1532-950X,NA,0,0,1,0,Veterinary Sciences,NA,NA,WILEY,NA +vetus testamentum,0042-4935,1568-5330,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +vial-vigo international journal of applied linguistics,1697-0381,1697-0381,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,UNIV VIGO,NA +vial-vigo international journal of applied linguistics,1697-0381,1697-0381,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,UNIV VIGO,NA +viator-medieval and renaissance studies,0083-5897,2031-0234,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies,BREPOLS PUBL,NA +vibrational spectroscopy,0924-2031,1873-3697,NA,0,0,1,0,"Chemistry, Analytical | Chemistry, Physical | Spectroscopy",NA,NA,ELSEVIER,NA +victims & offenders,1556-4886,1556-4991,uvao_journal,0,1,0,1,NA,Criminology & Penology,NA,TAYLOR & FRANCIS INC,2020-10-17 +victorian literature and culture,1060-1503,1470-1553,VLCjournal,1,0,0,1,NA,NA,Literature,CAMBRIDGE UNIV PRESS,2018-08-26 +victorian periodicals review,0709-4698,1712-526X,VPReditors,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",JOHNS HOPKINS UNIV PRESS,2013-01-22 +victorian poetry,0042-5206,1530-7190,NA,1,0,0,0,NA,NA,Poetry,WEST VIRGINIA UNIV PRESS,NA +victorian studies,0042-5222,1527-2052,VictStudies,1,0,0,1,NA,NA,"Humanities, Multidisciplinary",INDIANA UNIV PRESS,2011-04-12 +videosurgery and other miniinvasive techniques,1895-4588,2299-0054,NA,0,0,1,0,Surgery,NA,NA,TERMEDIA PUBLISHING HOUSE LTD,NA +vie et milieu-life and environment,0240-8759,NA,NA,0,0,1,0,Ecology | Marine & Freshwater Biology,NA,NA,OBSERVATOIRE OCEANOLOGIQUE BANYULS,NA +vierteljahrshefte fur zeitgeschichte,0042-5702,2196-7121,NA,1,0,0,0,NA,NA,History,WALTER DE GRUYTER GMBH,NA +vigiliae christianae,0042-6032,1570-0720,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +violence against women,1077-8012,1552-8448,VAWJournal,0,1,0,1,NA,Women'S Studies,NA,SAGE PUBLICATIONS INC,2014-08-16 +violence and victims,0886-6708,1945-7073,NA,0,1,0,0,NA,Criminology & Penology,NA,SPRINGER PUBLISHING CO,NA +viral immunology,0882-8245,1557-8976,viral_im_jrnl,0,0,1,1,Immunology | Virology,NA,NA,"MARY ANN LIEBERT, INC",2020-05-11 +virchows archiv,0945-6317,1432-2307,NA,0,0,1,0,Pathology,NA,NA,SPRINGER,NA +virginia law review,0042-6601,0042-6601,virginialawrev,0,1,0,1,NA,Law,NA,UNIV VIRGINIA LAW REVIEW ASSOC,2013-03-11 +virginia quarterly review,0042-675X,2154-6932,VQR,1,0,0,1,NA,NA,Literary Reviews,UNIV VIRGINIA,2009-04-07 +virologica sinica,1674-0769,1995-820X,NA,0,0,1,0,Virology,NA,NA,SPRINGER,NA +virologie,1267-8694,1950-6961,NA,0,0,1,0,Virology,NA,NA,JOHN LIBBEY EUROTEXT LTD,NA +virology,0042-6822,1089-862X,NA,0,0,1,0,Virology,NA,NA,ACADEMIC PRESS INC ELSEVIER SCIENCE,NA +virology journal,1743-422X,1743-422X,VirologyJ,0,0,1,1,Virology,NA,NA,BMC,2012-07-19 +virtual and physical prototyping,1745-2759,1745-2767,NA,0,0,1,0,"Engineering, Manufacturing | Materials Science, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +virtual reality,1359-4338,1434-9957,NA,0,0,1,0,"Computer Science, Interdisciplinary Applications | Computer Science, Software Engineering | Imaging Science & Photographic Technology",NA,NA,SPRINGER LONDON LTD,NA +virulence,2150-5594,2150-5608,Virulence12,0,0,1,1,Immunology | Infectious Diseases | Microbiology,NA,NA,TAYLOR & FRANCIS INC,2020-08-13 +virus evolution,2057-1577,2057-1577,Virus_Evolution,0,0,1,1,Virology,NA,NA,OXFORD UNIV PRESS,2014-08-06 +virus genes,0920-8569,1572-994X,NA,0,0,1,0,Genetics & Heredity | Virology,NA,NA,SPRINGER,NA +virus research,0168-1702,1872-7492,NA,0,0,1,0,Virology,NA,NA,ELSEVIER,NA +viruses-basel,1999-4915,1999-4915,VirusesMDPI,0,0,1,1,Virology,NA,NA,MDPI,2014-11-24 +visceral medicine,2297-4725,2297-475X,NA,0,0,1,0,Gastroenterology & Hepatology | Surgery,NA,NA,KARGER,NA +vision research,0042-6989,1878-5646,NA,0,0,1,0,Neurosciences | Ophthalmology | Psychology,NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +visual cognition,1350-6285,1464-0716,NA,0,1,0,0,NA,"Psychology, Experimental",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +visual communication,1470-3572,1741-3214,sage_vcj,0,1,0,1,NA,Communication,NA,SAGE PUBLICATIONS INC,2014-07-22 +visual computer,0178-2789,1432-2315,NA,0,0,1,0,"Computer Science, Software Engineering",NA,NA,SPRINGER,NA +visual neuroscience,0952-5238,1469-8714,NA,0,0,1,0,Neurosciences | Ophthalmology,NA,NA,CAMBRIDGE UNIV PRESS,NA +visual studies,1472-586X,1472-5878,_VisualStudies_,1,0,0,1,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2018-06-25 +vitamins and hormones,0083-6729,NA,NA,0,0,1,0,Biochemistry & Molecular Biology | Endocrinology & Metabolism,NA,NA,ELSEVIER ACADEMIC PRESS INC,NA +vitis,0042-7500,0042-7500,NA,0,0,1,0,Horticulture,NA,NA,JKI-INSTITUT REBENZUCHTUNG,NA +vivarium-an international journal for the philosophy and intellectual life of the middle ages and renaissance,0042-7543,1568-5349,NA,1,0,0,0,NA,NA,Philosophy | Medieval & Renaissance Studies,BRILL,NA +vjesnik za arheologiju i povijest dalmatinsku,1845-7789,NA,NA,1,0,0,0,NA,NA,Archaeology,ARHEOLOSKI MUZEJ-SPLIT,NA +vlaams diergeneeskundig tijdschrift,0303-9021,0303-9021,NA,0,0,1,0,Veterinary Sciences,NA,NA,UNIV GHENT,NA +vldb journal,1066-8888,0949-877X,NA,0,0,1,0,"Computer Science, Hardware & Architecture | Computer Science, Information Systems",NA,NA,SPRINGER,NA +vocations and learning,1874-785X,1874-7868,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER,NA +voices-the journal of new york folklore,0361-204X,0361-204X,VoicesJournal,1,0,0,1,NA,NA,Folklore,NEW YORK FOLKLORE SOC,2020-06-29 +voix & images,0318-9201,1705-933X,NA,1,0,0,0,NA,NA,Literary Reviews,UNIV QUEBEC-MONTREAL,NA +vojnosanitetski pregled,0042-8450,2406-0720,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,MILITARY MEDICAL ACAD-INI,NA +volkskunde,0042-8523,0042-8523,NA,1,0,0,0,NA,NA,Folklore,CENTRUM STUDIE DOCUMENTATIE,NA +voluntas,0957-8765,1573-7888,VoluntasJournal,0,1,0,1,NA,Social Issues,NA,SPRINGER,2021-03-20 +voprosy filosofii,0042-8744,0042-8744,NA,1,0,0,0,NA,NA,Philosophy,RUSSIAN ACAD SCIENCES-INST PHILOSOPHY,NA +voprosy istorii,0042-8779,1938-2561,NA,1,0,0,0,NA,NA,History,VOPROSY ISTORII,NA +voprosy psikhologii,0042-8841,NA,NA,0,1,0,0,NA,"Psychology, Educational",NA,MEZHDUNARODNAYA KNIGA,NA +vox sanguinis,0042-9007,1423-0410,NA,0,0,1,0,Hematology,NA,NA,WILEY,NA +waffen-und kostumkunde,0042-9945,NA,NA,1,0,0,0,NA,NA,Art,VERLAGSHAUS WERNER HOFMANN KG,NA +walt whitman quarterly review,0737-0679,2153-3695,NA,1,0,0,0,NA,NA,Poetry,"UNIV IOWA, DEPT ENGLISH",NA +war & society,0729-2473,2042-4345,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +war & society,0729-2473,2042-4345,NA,1,1,0,0,NA,History,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +war in history,0968-3445,1477-0385,NA,1,1,0,0,NA,History | International Relations,History,SAGE PUBLICATIONS LTD,NA +war in history,0968-3445,1477-0385,NA,1,1,0,0,NA,History | International Relations,History,SAGE PUBLICATIONS LTD,NA +wasafiri,0269-0055,1747-1508,WasafiriMag,1,0,0,1,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2014-03-26 +washington law review,0043-0617,NA,washlawreview,0,1,0,1,NA,Law,NA,UNIV WASHINGTON SCHOOL OF LAW,2013-04-09 +washington quarterly,0163-660X,1530-9177,twqgw,0,1,0,1,NA,International Relations | Law,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2012-09-11 +wasserwirtschaft,0043-0978,2192-8762,NA,0,0,1,0,Water Resources,NA,NA,SPRINGER VIEWEG-SPRINGER FACHMEDIEN WIESBADEN GMBH,NA +waste and biomass valorization,1877-2641,1877-265X,NA,0,0,1,0,Environmental Sciences,NA,NA,SPRINGER,NA +waste management,0956-053X,1879-2456,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +waste management & research,0734-242X,1096-3669,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences",NA,NA,SAGE PUBLICATIONS LTD,NA +water,2073-4441,2073-4441,Water_MDPI,0,0,1,1,Environmental Sciences | Water Resources,NA,NA,MDPI,2015-09-22 +water air and soil pollution,0049-6979,1573-2932,NA,0,0,1,0,Environmental Sciences | Meteorology & Atmospheric Sciences | Water Resources,NA,NA,SPRINGER INT PUBL AG,NA +water alternatives-an interdisciplinary journal on water politics and development,1965-0175,1965-0175,NA,0,1,1,0,Water Resources,Environmental Studies,NA,WATER ALTERNATIVES ASSOC,NA +water alternatives-an interdisciplinary journal on water politics and development,1965-0175,1965-0175,NA,0,1,1,0,Water Resources,Environmental Studies,NA,WATER ALTERNATIVES ASSOC,NA +water and environment journal,1747-6585,1747-6593,NA,0,0,1,0,Environmental Sciences | Limnology | Water Resources,NA,NA,WILEY,NA +water economics and policy,2382-624X,2382-6258,NA,0,1,1,0,Water Resources,Economics | Environmental Studies,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +water economics and policy,2382-624X,2382-6258,NA,0,1,1,0,Water Resources,Economics | Environmental Studies,NA,WORLD SCIENTIFIC PUBL CO PTE LTD,NA +water environment research,1061-4303,1554-7531,WERJournal,0,0,1,1,"Engineering, Environmental | Environmental Sciences | Limnology | Water Resources",NA,NA,WILEY,2015-06-09 +water international,0250-8060,1941-1707,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +water policy,1366-7017,1996-9759,NA,0,0,1,0,Water Resources,NA,NA,IWA PUBLISHING,NA +water quality research journal,2709-8044,2709-8052,NA,0,0,1,0,Water Resources,NA,NA,IWA PUBLISHING,NA +water research,0043-1354,1879-2448,WaterRes_J,0,0,1,1,"Engineering, Environmental | Environmental Sciences | Water Resources",NA,NA,PERGAMON-ELSEVIER SCIENCE LTD,2017-07-08 +water research x,NA,2589-9147,NA,0,0,1,0,"Water Resources | Environmental Sciences | Engineering, Environmental",NA,NA,ELSEVIER,NA +water resources,0097-8078,1608-344X,NA,0,0,1,0,Water Resources,NA,NA,MAIK NAUKA/INTERPERIODICA/SPRINGER,NA +water resources and economics,2212-4284,2212-4284,NA,0,1,1,0,Environmental Sciences | Water Resources,Economics | Environmental Studies,NA,ELSEVIER,NA +water resources and economics,2212-4284,2212-4284,NA,0,1,1,0,Environmental Sciences | Water Resources,Economics | Environmental Studies,NA,ELSEVIER,NA +water resources and industry,2212-3717,2212-3717,NA,0,0,1,0,Water Resources,NA,NA,ELSEVIER,NA +water resources management,0920-4741,1573-1650,NA,0,0,1,0,"Engineering, Civil | Water Resources",NA,NA,SPRINGER,NA +water resources research,0043-1397,1944-7973,NA,0,0,1,0,Environmental Sciences | Limnology | Water Resources,NA,NA,AMER GEOPHYSICAL UNION,NA +water reuse,2709-6092,2709-6106,NA,0,0,1,0,"Water Resources | Engineering, Environmental",NA,NA,IWA PUBLISHING,NA +water sa,0378-4738,1816-7950,NA,0,0,1,0,Water Resources,NA,NA,WATER RESEARCH COMMISSION,NA +water science and technology,0273-1223,1996-9732,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences | Water Resources",NA,NA,IWA PUBLISHING,NA +water supply,1606-9749,1607-0798,NA,0,0,1,0,"Engineering, Environmental | Environmental Sciences | Water Resources",NA,NA,IWA PUBLISHING,NA +waterbirds,1524-4695,1938-5390,WaterbirdsJourn,0,0,1,1,Ornithology,NA,NA,WATERBIRD SOC,2021-10-21 +wave motion,0165-2125,1878-433X,NA,0,0,1,0,"Acoustics | Mechanics | Physics, Multidisciplinary",NA,NA,ELSEVIER,NA +waves in random and complex media,1745-5030,1745-5049,NA,0,0,1,0,"Physics, Multidisciplinary",NA,NA,TAYLOR & FRANCIS LTD,NA +wear,0043-1648,1873-2577,NA,0,0,1,0,"Engineering, Mechanical | Materials Science, Multidisciplinary",NA,NA,ELSEVIER SCIENCE SA,NA +weather,0043-1656,1477-8696,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,WILEY,NA +weather and climate extremes,2212-0947,2212-0947,NA,0,0,1,0,Meteorology & Atmospheric Sciences,NA,NA,ELSEVIER,NA +weather and forecasting,0882-8156,1520-0434,AMS_Wea,0,0,1,1,Meteorology & Atmospheric Sciences,NA,NA,AMER METEOROLOGICAL SOC,2020-10-02 +weather climate and society,1948-8327,1948-8335,AMSWCAS,0,1,1,1,Meteorology & Atmospheric Sciences,Environmental Studies,NA,AMER METEOROLOGICAL SOC,2019-05-20 +weather climate and society,1948-8327,1948-8335,AMSWCAS,0,1,1,1,Meteorology & Atmospheric Sciences,Environmental Studies,NA,AMER METEOROLOGICAL SOC,2019-05-20 +web ecology,2193-3081,1399-1183,Web_Ecology,0,0,1,1,Ecology | Environmental Sciences,NA,NA,COPERNICUS GESELLSCHAFT MBH,2014-07-15 +weed biology and management,1444-6162,1445-6664,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,WILEY,NA +weed research,0043-1737,1365-3180,WeedResJournal,0,0,1,1,Agronomy | Plant Sciences,NA,NA,WILEY,2018-03-19 +weed science,0043-1745,1550-2759,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,CAMBRIDGE UNIV PRESS,NA +weed technology,0890-037X,1550-2740,NA,0,0,1,0,Agronomy | Plant Sciences,NA,NA,CAMBRIDGE UNIV PRESS,NA +weimarer beitrage,0043-2199,NA,NA,1,0,0,0,NA,NA,Literature,PASSAGEN VERLAG GES MBH,NA +welding in the world,0043-2288,1878-6669,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,SPRINGER HEIDELBERG,NA +welding journal,0043-2296,0043-2296,NA,0,0,1,0,Metallurgy & Metallurgical Engineering,NA,NA,AMER WELDING SOC,NA +welsh history review,0043-2431,0083-792X,NA,1,0,0,0,NA,NA,History,UNIV WALES PRESS,NA +welt der slaven-halbjahresschrift fur slavistik,0043-2520,NA,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary",HARRASSOWITZ VERLAG,NA +welt des islams,0043-2539,0043-2539,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +west european politics,0140-2382,1743-9655,wepsocial,0,1,0,1,NA,Political Science,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2015-10-13 +west indian medical journal,0043-3144,2309-5830,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,UNIV WEST INDIES FACULTY MEDICAL SCIENCES,NA +westerly,0043-342X,NA,WesterlyMag,1,0,0,1,NA,NA,Literary Reviews,CENT STUDIES AUSTRALIAN LIT,2012-03-02 +western american literature,0043-3462,1948-7142,WestLiterature,1,0,0,1,NA,NA,"Literature, American",UTAH STATE UNIV,2017-12-12 +western folklore,0043-373X,NA,NA,1,0,0,0,NA,NA,Folklore,CALIFORNIA FOLKLORE SOC,NA +western historical quarterly,0043-3810,1939-8603,WesternHistori1,1,0,0,1,NA,NA,History,OXFORD UNIV PRESS INC,2020-09-07 +western humanities review,0043-3845,NA,WH_Review,1,0,0,1,NA,NA,Literary Reviews,UNIV UTAH DEPT ENGLISH,2017-08-21 +western journal of emergency medicine,1936-900X,1936-9018,NA,0,0,1,0,Emergency Medicine,NA,NA,WESTJEM,NA +western journal of nursing research,0193-9459,1552-8456,WJNR_journal,0,1,1,1,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,2021-12-10 +western journal of nursing research,0193-9459,1552-8456,WJNR_journal,0,1,1,1,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,2021-12-10 +western north american naturalist,1527-0904,1944-8341,WNANat,0,0,1,1,Biodiversity Conservation | Ecology,NA,NA,BRIGHAM YOUNG UNIV,2012-06-20 +wetlands,0277-5212,1943-6246,NA,0,0,1,0,Ecology | Environmental Sciences,NA,NA,SPRINGER,NA +wetlands ecology and management,0923-4861,1572-9834,NA,0,0,1,0,Environmental Sciences | Water Resources,NA,NA,SPRINGER,NA +who technical report series,0512-3054,0512-3054,NA,0,0,1,0,"Public, Environmental & Occupational Health",NA,NA,WORLD HEALTH ORGANIZATION,NA +wiener klinische wochenschrift,0043-5325,1613-7671,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,SPRINGER WIEN,NA +wiener tierarztliche monatsschrift,0043-535X,NA,NA,0,0,1,0,Veterinary Sciences,NA,NA,B W K PUBLISHING SOLUTIONS & VERLAG,NA +wilderness & environmental medicine,1080-6032,1545-1534,NA,0,0,1,0,"Public, Environmental & Occupational Health | Sport Sciences",NA,NA,ELSEVIER SCIENCE INC,NA +wildfowl,0954-6324,2052-6458,NA,0,0,1,0,Ornithology,NA,NA,WILDFOWL & WETLANDS TRUST,NA +wildlife biology,0909-6396,1903-220X,WildlifeBiol,0,0,1,1,Ecology | Zoology,NA,NA,WILDLIFE BIOLOGY,2013-12-06 +wildlife monographs,0084-0173,1938-5455,NA,0,0,1,0,Ecology | Zoology,NA,NA,WILEY,NA +wildlife research,1035-3712,1448-5494,NA,0,0,1,0,Ecology | Zoology,NA,NA,CSIRO PUBLISHING,NA +wildlife society bulletin,2328-5540,2328-5540,NA,0,0,1,0,Biodiversity Conservation,NA,NA,WILEY,NA +wiley interdisciplinary reviews-climate change,1757-7780,1757-7799,NA,0,1,1,0,Meteorology & Atmospheric Sciences,Environmental Studies,NA,WILEY,NA +wiley interdisciplinary reviews-climate change,1757-7780,1757-7799,NA,0,1,1,0,Meteorology & Atmospheric Sciences,Environmental Studies,NA,WILEY,NA +wiley interdisciplinary reviews-cognitive science,1939-5078,1939-5086,NA,0,1,0,0,NA,"Psychology, Experimental",NA,WILEY,NA +wiley interdisciplinary reviews-computational molecular science,1759-0876,1759-0884,NA,0,0,1,0,"Chemistry, Multidisciplinary | Mathematical & Computational Biology",NA,NA,WILEY,NA +wiley interdisciplinary reviews-data mining and knowledge discovery,1942-4787,1942-4795,NA,0,0,1,0,"Computer Science, Artificial Intelligence | Computer Science, Theory & Methods",NA,NA,"WILEY PERIODICALS, INC",NA +wiley interdisciplinary reviews-developmental biology,1759-7684,1759-7692,NA,0,0,1,0,Developmental Biology,NA,NA,WILEY,NA +wiley interdisciplinary reviews-energy and environment,2041-8396,2041-840X,NA,0,0,1,0,Energy & Fuels,NA,NA,"WILEY PERIODICALS, INC",NA +wiley interdisciplinary reviews-nanomedicine and nanobiotechnology,1939-5116,1939-0041,NA,0,0,1,0,"Nanoscience & Nanotechnology | Medicine, Research & Experimental",NA,NA,WILEY,NA +wiley interdisciplinary reviews-rna,1757-7004,1757-7012,NA,0,0,1,0,Cell Biology,NA,NA,WILEY,NA +wiley interdisciplinary reviews-water,2049-1948,2049-1948,NA,0,0,1,0,Environmental Sciences | Water Resources,NA,NA,WILEY,NA +willdenowia,0511-9618,1868-6397,NA,0,0,1,0,Plant Sciences,NA,NA,BOTANISCHER GARTEN & BOTANISCHE MUSEUM BERLIN-DAHLEM,NA +william and mary quarterly,0043-5597,1933-7698,NA,1,0,0,0,NA,NA,History,INST EARLY AMER HIST CULT,NA +wilson journal of ornithology,1559-4491,1938-5447,NA,0,0,1,0,Ornithology,NA,NA,WILSON ORNITHOLOGICAL SOC,NA +wind and structures,1226-6116,1598-6225,NA,0,0,1,0,"Construction & Building Technology | Engineering, Civil | Mechanics",NA,NA,TECHNO-PRESS,NA +wind energy,1095-4244,1099-1824,NA,0,0,1,0,"Energy & Fuels | Engineering, Mechanical",NA,NA,WILEY,NA +winterthur portfolio-a journal of american material culture,0084-0416,1545-6927,NA,1,0,0,0,NA,NA,Art,UNIV CHICAGO PRESS,NA +wireless communications & mobile computing,1530-8669,1530-8677,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,WILEY-HINDAWI,NA +wireless networks,1022-0038,1572-8196,NA,0,0,1,0,"Computer Science, Information Systems | Engineering, Electrical & Electronic | Telecommunications",NA,NA,SPRINGER,NA +wireless personal communications,0929-6212,1572-834X,NA,0,0,1,0,Telecommunications,NA,NA,SPRINGER,NA +wires mechanisms of disease,2692-9368,2692-9368,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,WILEY,NA +wisconsin law review,0043-650X,1943-1120,wislrev,0,1,0,1,NA,Law,NA,UNIV WISCONSIN LAW SCHOOL,2020-02-15 +wochenblatt fur papierfabrikation,0043-7131,0043-7131,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,DEUTSCHER FACHVERLAG GMBH,NA +womans art journal,0270-7993,2158-8457,NA,1,0,0,0,NA,NA,Art,OLD CITY PUBLISHING INC,NA +women & criminal justice,0897-4454,1541-0323,womencj_journal,0,1,0,1,NA,Criminology & Penology | Women'S Studies,NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2013-02-28 +women & health,0363-0242,1541-0331,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health | Women'S Studies",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +women & therapy,0270-3149,1541-0315,NA,0,1,0,0,NA,"Psychology, Multidisciplinary | Women'S Studies",NA,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +women and birth,1871-5192,1878-1799,NA,0,1,1,0,Nursing | Obstetrics & Gynecology,Nursing,NA,ELSEVIER,NA +women and birth,1871-5192,1878-1799,NA,0,1,1,0,Nursing | Obstetrics & Gynecology,Nursing,NA,ELSEVIER,NA +womens health issues,1049-3867,1878-4321,WHIjournal,0,1,0,1,NA,"Public, Environmental & Occupational Health | Women'S Studies",NA,ELSEVIER SCIENCE INC,2014-08-11 +womens history review,0961-2025,1747-583X,womenshistrev,1,0,0,1,NA,NA,History,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",2017-12-18 +womens studies-an interdisciplinary journal,0049-7878,1547-7045,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +womens studies international forum,0277-5395,1879-243X,NA,0,1,0,0,NA,Women'S Studies,NA,PERGAMON-ELSEVIER SCIENCE LTD,NA +wood and fiber science,0735-6161,0735-6161,NA,0,0,1,0,"Forestry | Materials Science, Paper & Wood | Materials Science, Textiles",NA,NA,SOC WOOD SCI TECHNOL,NA +wood material science & engineering,1748-0272,1748-0280,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,TAYLOR & FRANCIS LTD,NA +wood research,1336-4561,NA,NA,0,0,1,0,"Materials Science, Paper & Wood",NA,NA,SLOVAK FOREST PRODUCTS RESEARCH INST,NA +wood science and technology,0043-7719,1432-5225,NA,0,0,1,0,"Forestry | Materials Science, Paper & Wood",NA,NA,SPRINGER,NA +word & image,0266-6286,1943-2178,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +wordsworth circle,0043-8006,2640-7310,NA,1,0,0,0,NA,NA,Poetry,UNIV CHICAGO PRESS,NA +work-a journal of prevention assessment & rehabilitation,1051-9815,1875-9270,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,IOS PRESS,NA +work aging and retirement,2054-4642,2054-4650,NA,0,1,0,0,NA,"Industrial Relations & Labor | Psychology, Applied | Management",NA,OXFORD UNIV PRESS,NA +work and occupations,0730-8884,1552-8464,NA,0,1,0,0,NA,Industrial Relations & Labor | Sociology,NA,SAGE PUBLICATIONS INC,NA +work and stress,0267-8373,1464-5335,NA,0,1,0,0,NA,"Psychology, Applied",NA,TAYLOR & FRANCIS LTD,NA +work employment and society,0950-0170,1469-8722,NA,0,1,0,0,NA,Economics | Industrial Relations & Labor | Sociology,NA,SAGE PUBLICATIONS LTD,NA +workplace health & safety,2165-0799,2165-0969,WHS_Journal,0,1,1,1,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,2021-08-15 +workplace health & safety,2165-0799,2165-0969,WHS_Journal,0,1,1,1,Nursing,Nursing,NA,SAGE PUBLICATIONS INC,2021-08-15 +world allergy organization journal,1939-4551,1939-4551,JournalWao,0,0,1,1,Allergy | Immunology,NA,NA,ELSEVIER,2019-07-16 +world archaeology,0043-8243,1470-1375,NA,1,0,0,0,NA,NA,Archaeology,"ROUTLEDGE JOURNALS, TAYLOR & FRANCIS LTD",NA +world bank economic review,0258-6770,1564-698X,NA,0,1,0,0,NA,"Business, Finance | Development Studies | Economics",NA,OXFORD UNIV PRESS,NA +world bank research observer,0257-3032,1564-6971,NA,0,1,0,0,NA,Development Studies | Economics,NA,OXFORD UNIV PRESS,NA +world development,0305-750X,1873-5991,WorldDevJournal,0,1,0,1,NA,Development Studies | Economics,NA,PERGAMON-ELSEVIER SCIENCE LTD,2014-01-08 +world economy,0378-5920,1467-9701,NA,0,1,0,0,NA,"Business, Finance | Economics | International Relations",NA,WILEY,NA +world englishes,0883-2919,1467-971X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WILEY,NA +world englishes,0883-2919,1467-971X,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,WILEY,NA +world journal of biological psychiatry,1562-2975,1814-1412,NA,0,0,1,0,Psychiatry,NA,NA,TAYLOR & FRANCIS LTD,NA +world journal of clinical cases,2307-8960,2307-8960,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,BAISHIDENG PUBLISHING GROUP INC,NA +world journal of diabetes,NA,1948-9358,NA,0,0,1,0,Endocrinology & Metabolism,NA,NA,BAISHIDENG PUBLISHING GROUP INC,NA +world journal of emergency medicine,1920-8642,1920-8642,NA,0,0,1,0,Emergency Medicine,NA,NA,ZHEJIANG UNIV PRESS,NA +world journal of emergency surgery,1749-7922,1749-7922,NA,0,0,1,0,Emergency Medicine | Surgery,NA,NA,BMC,NA +world journal of gastroenterology,1007-9327,2219-2840,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,BAISHIDENG PUBLISHING GROUP INC,NA +world journal of gastrointestinal oncology,1948-5204,1948-5204,NA,0,0,1,0,Oncology | Gastroenterology & Hepatology,NA,NA,BAISHIDENG PUBLISHING GROUP INC,NA +world journal of gastrointestinal surgery,1948-9366,1948-9366,NA,0,0,1,0,Gastroenterology & Hepatology | Surgery,NA,NA,BAISHIDENG PUBLISHING GROUP INC,NA +world journal of mens health,2287-4208,2287-4690,NA,0,0,1,0,Andrology | Urology & Nephrology,NA,NA,KOREAN SOC SEXUAL MEDICINE & ANDROLOGY,NA +world journal of microbiology & biotechnology,0959-3993,1573-0972,NA,0,0,1,0,Biotechnology & Applied Microbiology,NA,NA,SPRINGER,NA +world journal of pediatrics,1708-8569,1867-0687,World_J_Pediatr,0,0,1,1,Pediatrics,NA,NA,ZHEJIANG UNIV PRESS,2020-09-29 +world journal of psychiatry,2220-3206,2220-3206,NA,0,0,1,0,Psychiatry,NA,NA,BAISHIDENG PUBLISHING GROUP INC,NA +world journal of stem cells,1948-0210,1948-0210,NA,0,0,1,0,Cell & Tissue Engineering | Cell Biology,NA,NA,BAISHIDENG PUBLISHING GROUP INC,NA +world journal of surgery,0364-2313,1432-2323,WorldJSurg,0,0,1,1,Surgery,NA,NA,SPRINGER,2014-10-30 +world journal of surgical oncology,1477-7819,1477-7819,NA,0,0,1,0,Oncology | Surgery,NA,NA,BMC,NA +world journal of urology,0724-4983,1433-8726,wjurol,0,0,1,1,Urology & Nephrology,NA,NA,SPRINGER,2016-04-09 +world literature studies,1337-9275,1337-9690,NA,1,0,0,0,NA,NA,Literature,INST WORLD LITERATURE SLOVAK ACAD SCIENCES,NA +world literature today,0196-3570,1945-8134,worldlittoday,1,0,0,1,NA,NA,Literature,UNIV OKLAHOMA PRESS,2009-06-01 +world mycotoxin journal,1875-0710,1875-0796,WorldMycotoxinJ,0,0,1,1,Food Science & Technology | Mycology | Toxicology,NA,NA,WAGENINGEN ACADEMIC PUBLISHERS,2017-11-10 +world neurosurgery,1878-8750,1878-8769,WorldNeurosurg,0,0,1,1,Clinical Neurology | Surgery,NA,NA,ELSEVIER SCIENCE INC,2017-11-28 +world of music-new series,0043-8774,NA,NA,1,0,0,0,NA,NA,Music,VWB-VERLAG WISSENSCHAFT & BILDUNG,NA +world politics,0043-8871,1086-3338,world_pol,0,1,0,1,NA,International Relations | Political Science,NA,CAMBRIDGE UNIV PRESS,2013-09-09 +world psychiatry,1723-8617,2051-5545,NA,0,1,1,0,Psychiatry,Psychiatry,NA,WILEY,NA +world psychiatry,1723-8617,2051-5545,NA,0,1,1,0,Psychiatry,Psychiatry,NA,WILEY,NA +world rabbit science,1257-5011,1989-8886,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,UNIV POLITECNICA VALENCIA,NA +world review of nutrition and dietetics,0084-2230,1662-3975,NA,0,0,1,0,Nutrition & Dietetics,NA,NA,KARGER,NA +world trade review,1474-7456,1475-3138,trade_review,0,1,0,1,NA,Economics | International Relations | Law,NA,CAMBRIDGE UNIV PRESS,2020-08-20 +world wide web-internet and web information systems,1386-145X,1573-1413,NA,0,0,1,0,"Computer Science, Information Systems | Computer Science, Software Engineering",NA,NA,SPRINGER,NA +worlds poultry science journal,0043-9339,1743-4777,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,TAYLOR & FRANCIS LTD,NA +worldviews on evidence-based nursing,1545-102X,1741-6787,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +worldviews on evidence-based nursing,1545-102X,1741-6787,NA,0,1,1,0,Nursing,Nursing,NA,WILEY,NA +wound management & prevention,2640-5237,2640-5245,woundmanageprev,0,1,1,1,Dermatology | Nursing,Nursing,NA,HMP,2009-03-02 +wound management & prevention,2640-5237,2640-5245,woundmanageprev,0,1,1,1,Dermatology | Nursing,Nursing,NA,HMP,2009-03-02 +wound repair and regeneration,1067-1927,1524-475X,NA,0,0,1,0,"Cell Biology | Dermatology | Medicine, Research & Experimental | Surgery",NA,NA,WILEY,NA +wounds-a compendium of clinical research and practice,1044-7946,1943-2704,WOUNDSJournal,0,0,1,1,Dermatology | Surgery,NA,NA,H M P COMMUNICATIONS,2009-03-02 +written communication,0741-0883,1552-8472,writtencomm,0,1,0,1,NA,Communication,NA,SAGE PUBLICATIONS INC,2010-10-27 +wulfenia,1561-882X,1561-882X,NA,0,0,1,0,Plant Sciences,NA,NA,LANDESMUSEUM KARNTEN,NA +x-ray spectrometry,0049-8246,1097-4539,NA,0,0,1,0,Spectroscopy,NA,NA,WILEY,NA +xenobiotica,0049-8254,1366-5928,NA,0,0,1,0,Pharmacology & Pharmacy | Toxicology,NA,NA,TAYLOR & FRANCIS LTD,NA +xenotransplantation,0908-665X,1399-3089,NA,0,0,1,0,"Medicine, Research & Experimental | Transplantation",NA,NA,WILEY,NA +yakugaku zasshi-journal of the pharmaceutical society of japan,0031-6903,1347-5231,NA,0,0,1,0,Pharmacology & Pharmacy,NA,NA,PHARMACEUTICAL SOC JAPAN,NA +yale french studies,0044-0078,NA,NA,1,0,0,0,NA,NA,"Literature, Romance",YALE FRENCH STUDIES,NA +yale journal of biology and medicine,0044-0086,1551-4056,theYJBM,0,0,1,1,Biology,NA,NA,"YALE J BIOLOGY MEDICINE, INC",2011-07-14 +yale journal on regulation,0741-9457,2376-5925,yalejreg,0,1,0,1,NA,Law,NA,YALE JOURNAL ON REGULATION,2014-09-14 +yale law journal,0044-0094,1939-8611,yaleljournal,0,1,0,1,NA,Law,NA,YALE LAW J CO INC,2011-11-18 +yale review,0044-0124,1467-9736,YaleReview,1,0,0,1,NA,NA,Literary Reviews,WILEY,2012-09-03 +yearbook for traditional music,0740-1558,2304-3857,NA,1,0,0,0,NA,NA,Music,CAMBRIDGE UNIV PRESS,NA +yeast,0749-503X,1097-0061,Yeast_Journal,0,0,1,1,Biochemistry & Molecular Biology | Biotechnology & Applied Microbiology | Microbiology | Mycology,NA,NA,WILEY,2019-01-11 +yonago acta medica,0513-5710,1346-8049,NA,0,0,1,0,"Medicine, Research & Experimental",NA,NA,TOTTORI UNIV MEDICAL PRESS,NA +yonsei medical journal,0513-5796,1976-2437,NA,0,0,1,0,"Medicine, General & Internal",NA,NA,YONSEI UNIV COLL MEDICINE,NA +young,1103-3088,1741-3222,editorsyoung,0,1,0,1,NA,"Social Sciences, Interdisciplinary | Sociology",NA,SAGE PUBLICATIONS LTD,2015-01-23 +youth & society,0044-118X,1552-8499,NA,0,1,0,0,NA,"Social Issues | Social Sciences, Interdisciplinary | Sociology",NA,SAGE PUBLICATIONS INC,NA +youth justice-an international journal,1473-2254,1747-6283,NA,0,1,0,0,NA,Criminology & Penology,NA,SAGE PUBLICATIONS LTD,NA +youth violence and juvenile justice,1541-2040,1556-9330,NA,0,1,0,0,NA,Criminology & Penology,NA,SAGE PUBLICATIONS INC,NA +zamm-zeitschrift fur angewandte mathematik und mechanik,0044-2267,1521-4001,NA,0,0,1,0,"Mathematics, Applied | Mechanics",NA,NA,WILEY-V C H VERLAG GMBH,NA +zdm-mathematics education,1863-9690,1863-9704,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER HEIDELBERG,NA +zdravstveno varstvo,0351-0026,1854-2476,NA,0,1,0,0,NA,"Public, Environmental & Occupational Health",NA,INST PUBLIC HEALTH REPUBLIC SLOVENIA,NA +zebrafish,1545-8547,1557-8542,NA,0,0,1,0,Developmental Biology | Zoology,NA,NA,"MARY ANN LIEBERT, INC",NA +zeitgeschichte,0256-5250,2569-5304,zeitgeschichte,1,1,0,1,NA,History,History,VANDENHOECK & RUPRECHT GMBH & CO KG,2010-05-31 +zeitgeschichte,0256-5250,2569-5304,zeitgeschichte,1,1,0,1,NA,History,History,VANDENHOECK & RUPRECHT GMBH & CO KG,2010-05-31 +zeitschrift der deutschen gesellschaft fur geowissenschaften,1860-1804,NA,NA,0,0,1,0,"Geosciences, Multidisciplinary",NA,NA,E SCHWEIZERBARTSCHE VERLAGSBUCHHANDLUNG,NA +zeitschrift der deutschen morgenlandischen gesellschaft,0341-0137,0341-0137,NA,1,0,0,0,NA,NA,Asian Studies,HARRASSOWITZ VERLAG,NA +zeitschrift des deutschen palastina-vereins,0012-1169,NA,NA,1,0,0,0,NA,NA,Archaeology | Asian Studies,VERLAG OTTO HARRASSOWITZ,NA +zeitschrift des deutschen vereins fur kunstwissenschaft,0044-2135,NA,NA,1,0,0,0,NA,NA,Art,DEUTSCHER VERLAG KUNSTWISSEN,NA +zeitschrift fur agyptische sprache und altertumskunde,0044-216X,2196-713X,NA,1,0,0,0,NA,NA,Archaeology,WALTER DE GRUYTER GMBH,NA +zeitschrift fur analysis und ihre anwendungen,0232-2064,1661-4534,NA,0,0,1,0,"Mathematics, Applied | Mathematics",NA,NA,EUROPEAN MATHEMATICAL SOC-EMS,NA +zeitschrift fur angewandte mathematik und physik,0044-2275,1420-9039,NA,0,0,1,0,"Mathematics, Applied",NA,NA,SPRINGER INT PUBL AG,NA +zeitschrift fur anglistik und amerikanistik,0044-2305,2196-4726,NA,1,0,0,0,NA,NA,Literature,WALTER DE GRUYTER GMBH,NA +zeitschrift fur anorganische und allgemeine chemie,0044-2313,1521-3749,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear",NA,NA,WILEY-V C H VERLAG GMBH,NA +zeitschrift fur antikes christentum-journal of ancient christianity,0949-9571,1612-961X,NA,1,0,0,0,NA,NA,Religion,WALTER DE GRUYTER GMBH,NA +zeitschrift fur arbeits-und organisationspsychologie,0932-4089,2190-6270,NA,0,1,0,0,NA,"Psychology, Applied",NA,HOGREFE VERLAG,NA +zeitschrift fur arznei- & gewurzpflanzen,1431-9292,NA,NA,0,0,1,0,Plant Sciences,NA,NA,AGRIMEDIA GMBH,NA +zeitschrift fur assyriologie und vorderasiatische archaologie,0084-5299,1613-1150,NA,1,0,0,0,NA,NA,History | Language & Linguistics | Archaeology,WALTER DE GRUYTER GMBH,NA +zeitschrift fur bibliothekswesen und bibliographie,0044-2380,1864-2950,NA,0,1,0,0,NA,Information Science & Library Science,NA,VITTORIO KLOSTERMANN GMBH,NA +zeitschrift fur deutsche philologie,0044-2496,NA,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian | Language & Linguistics",ERICH SCHMIDT VERLAG,NA +zeitschrift fur deutsches altertum und deutsche literatur,0044-2518,0044-2518,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",S HIRZEL VERLAG,NA +zeitschrift fur dialektologie und linguistik,0044-1449,2366-2395,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,FRANZ STEINER VERLAG GMBH,NA +zeitschrift fur dialektologie und linguistik,0044-1449,2366-2395,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,FRANZ STEINER VERLAG GMBH,NA +zeitschrift fur die alttestamentliche wissenschaft,0044-2526,1613-0103,NA,1,0,0,0,NA,NA,Religion,WALTER DE GRUYTER GMBH,NA +zeitschrift fur die neutestamentliche wissenschaft und die kunde der alteren kirche,0044-2615,1613-009X,NA,1,0,0,0,NA,NA,Religion,WALTER DE GRUYTER GMBH,NA +zeitschrift fur entwicklungspsychologie und padagogische psychologie,0049-8637,2190-6262,NA,0,1,0,0,NA,"Psychology, Educational",NA,HOGREFE VERLAG,NA +zeitschrift fur erziehungswissenschaft,1434-663X,1862-5215,NA,0,1,0,0,NA,Education & Educational Research,NA,SPRINGER VIEWEG-SPRINGER FACHMEDIEN WIESBADEN GMBH,NA +zeitschrift fur ethnologie,0044-2666,NA,NA,0,1,0,0,NA,Anthropology,NA,DIETRICH REIMER VERLAG,NA +zeitschrift fur evaluation,1619-5515,1619-5515,NA,0,1,0,0,NA,"Social Sciences, Interdisciplinary",NA,WAXMANN VERLAG GMBH,NA +zeitschrift fur evangelische ethik,0044-2674,2197-912X,NA,1,0,0,0,NA,NA,Religion,WALTER DE GRUYTER GMBH,NA +zeitschrift fur franzosische sprache und literatur,0044-2747,2366-2425,NA,1,0,0,0,NA,NA,"Literature, Romance",FRANZ STEINER VERLAG GMBH,NA +zeitschrift fur gastroenterologie,0044-2771,1439-7803,NA,0,0,1,0,Gastroenterology & Hepatology,NA,NA,GEORG THIEME VERLAG KG,NA +zeitschrift fur geburtshilfe und neonatologie,0948-2393,1439-1651,NA,0,0,1,0,Obstetrics & Gynecology | Pediatrics,NA,NA,GEORG THIEME VERLAG KG,NA +zeitschrift fur geomorphologie,0372-8854,NA,NA,0,0,1,0,"Geography, Physical | Geosciences, Multidisciplinary",NA,NA,GEBRUDER BORNTRAEGER,NA +zeitschrift fur germanistik,0323-7982,NA,NA,1,0,0,0,NA,NA,"Literature, German, Dutch, Scandinavian",PETER LANG GMBH,NA +zeitschrift fur germanistische linguistik,0301-3294,1613-0626,NA,1,0,0,0,NA,NA,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +zeitschrift fur gerontologie und geriatrie,0948-6704,1435-1269,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,SPRINGER HEIDELBERG,NA +zeitschrift fur gerontologie und geriatrie,0948-6704,1435-1269,NA,0,1,1,0,Geriatrics & Gerontology,Gerontology,NA,SPRINGER HEIDELBERG,NA +zeitschrift fur geschichtswissenschaft,0044-2828,1618-0372,NA,1,0,0,0,NA,NA,History,METROPOL-VERLAG,NA +zeitschrift fur historische forschung,0340-0174,1865-5599,NA,1,0,0,0,NA,NA,History,DUNCKER & HUMBLOT GMBH,NA +zeitschrift fur katalanistik,0932-2221,0932-2221,NA,1,0,0,0,NA,NA,"Literature, Romance | Language & Linguistics",ALBERT LUDWIGS UNIV,NA +zeitschrift fur kinder-und jugendpsychiatrie und psychotherapie,1422-4917,1664-2880,NA,0,1,0,0,NA,Psychiatry,NA,HOGREFE AG-HOGREFE AG SUISSE,NA +zeitschrift fur kirchengeschichte,0044-2925,NA,NA,1,0,0,0,NA,NA,Religion,W KOHLHAMMER GMBH,NA +zeitschrift fur klinische psychologie und psychotherapie,1616-3443,2190-6297,NA,0,1,0,0,NA,"Psychology, Clinical",NA,HOGREFE VERLAG,NA +zeitschrift fur kristallographie-crystalline materials,2194-4946,2196-7105,NA,0,0,1,0,Crystallography,NA,NA,WALTER DE GRUYTER GMBH,NA +zeitschrift fur kristallographie-new crystal structures,1433-7266,2197-4578,NA,0,0,1,0,Crystallography,NA,NA,WALTER DE GRUYTER GMBH,NA +zeitschrift fur kunstgeschichte,0044-2992,2569-1619,RedaktionZfKG,1,0,0,1,NA,NA,Art,DEUTSCHER KUNSTVERLAG GMBH,2020-06-23 +zeitschrift fur medizinische physik,0939-3889,1876-4436,NA,0,0,1,0,"Radiology, Nuclear Medicine & Medical Imaging",NA,NA,ELSEVIER,NA +zeitschrift fur naturforschung section a-a journal of physical sciences,0932-0784,1865-7109,NA,0,0,1,0,"Chemistry, Physical | Physics, Multidisciplinary",NA,NA,WALTER DE GRUYTER GMBH,NA +zeitschrift fur naturforschung section b-a journal of chemical sciences,0932-0776,1865-7117,NA,0,0,1,0,"Chemistry, Inorganic & Nuclear | Chemistry, Organic",NA,NA,WALTER DE GRUYTER GMBH,NA +zeitschrift fur naturforschung section c-a journal of biosciences,0939-5075,1865-7125,NA,0,0,1,0,Biochemistry & Molecular Biology | Pharmacology & Pharmacy,NA,NA,WALTER DE GRUYTER GMBH,NA +zeitschrift fur neuropsychologie,1016-264X,1664-2902,NA,0,0,1,0,Clinical Neurology | Psychology,NA,NA,HOGREFE AG-HOGREFE AG SUISSE,NA +zeitschrift fur orthopadie und unfallchirurgie,1864-6697,1864-6743,NA,0,0,1,0,Orthopedics,NA,NA,THIEME MEDICAL PUBL INC,NA +zeitschrift fur padagogik,0044-3247,NA,ZfPaed,0,1,0,1,NA,Education & Educational Research,NA,VERLAG JULIUS BELTZ,2022-04-20 +zeitschrift fur padagogische psychologie,1010-0652,1664-2910,NA,0,1,0,0,NA,"Psychology, Educational",NA,HOGREFE AG-HOGREFE AG SUISSE,NA +zeitschrift fur philosophische forschung,0044-3301,1439-2615,NA,1,0,0,0,NA,NA,Philosophy,VITTORIO KLOSTERMANN GMBH,NA +zeitschrift fur physikalische chemie-international journal of research in physical chemistry & chemical physics,0942-9352,2196-7156,NA,0,0,1,0,"Chemistry, Physical",NA,NA,WALTER DE GRUYTER GMBH,NA +zeitschrift fur psychologie-journal of psychology,2190-8370,2151-2604,NA,0,1,0,0,NA,"Psychology, Multidisciplinary",NA,HOGREFE PUBLISHING CORP,NA +zeitschrift fur psychosomatische medizin und psychotherapie,1438-3608,2196-8349,NA,0,1,1,0,Psychiatry | Psychology,"Psychology, Clinical | Psychology, Multidisciplinary | Psychology, Psychoanalysis",NA,VANDENHOECK & RUPRECHT GMBH & CO KG,NA +zeitschrift fur psychosomatische medizin und psychotherapie,1438-3608,2196-8349,NA,0,1,1,0,Psychiatry | Psychology,"Psychology, Clinical | Psychology, Multidisciplinary | Psychology, Psychoanalysis",NA,VANDENHOECK & RUPRECHT GMBH & CO KG,NA +zeitschrift fur religions-und geistesgeschichte,0044-3441,0044-3441,NA,1,0,0,0,NA,NA,Religion,BRILL,NA +zeitschrift fur rheumatologie,0340-1855,1435-1250,NA,0,0,1,0,Rheumatology,NA,NA,SPRINGER HEIDELBERG,NA +zeitschrift fur romanische philologie,0049-8661,1865-9063,NA,1,0,0,0,NA,NA,"Language & Linguistics | Literature, Romance",WALTER DE GRUYTER GMBH,NA +zeitschrift fur semiotik,0170-6241,2625-4328,NA,1,0,0,0,NA,NA,"Humanities, Multidisciplinary","STAUFFENBURG VERLAG, BRIGITTE NARR GMBH",NA +zeitschrift fur sexualforschung,0932-8114,1438-9460,NA,0,1,0,0,NA,"Psychology, Clinical | Social Sciences, Interdisciplinary",NA,GEORG THIEME VERLAG KG,NA +zeitschrift fur slavische philologie,0044-3492,2509-7482,NA,1,0,0,0,NA,NA,"Literature, Slavic",UNIVERSITATSVERLAG C WINTER HEIDELBERG GMBH,NA +zeitschrift fur slawistik,0044-3506,2196-7016,NA,1,0,0,0,NA,NA,Language & Linguistics,WALTER DE GRUYTER GMBH,NA +zeitschrift fur soziologie,0340-1804,2366-0325,NA,0,1,0,0,NA,Sociology,NA,WALTER DE GRUYTER GMBH,NA +zeitschrift fur soziologie der erziehung und sozialisation,1436-1957,NA,NA,0,1,0,0,NA,Education & Educational Research,NA,JUVENTA VERLAG GMBH,NA +zeitschrift fur sportpsychologie,1612-5010,2190-6300,NA,0,1,0,0,NA,"Psychology, Applied",NA,HOGREFE VERLAG,NA +zeitschrift fur sprachwissenschaft,0721-9067,1613-3706,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +zeitschrift fur sprachwissenschaft,0721-9067,1613-3706,NA,1,1,0,0,NA,Linguistics,Language & Linguistics,DE GRUYTER MOUTON,NA +zeitschrift fur theologie und kirche,0044-3549,1868-7377,NA,1,0,0,0,NA,NA,Religion,J C B MOHR,NA +zeitschrift fur volkskunde,0044-3700,2699-5522,NA,1,0,0,0,NA,NA,Folklore,WAXMANN VERLAG GMBH,NA +zeitschrift fur wirtschaftsgeographie,0044-3751,2365-7693,NA,0,1,0,0,NA,Economics | Geography,NA,WALTER DE GRUYTER GMBH,NA +zemdirbyste-agriculture,1392-3196,1392-3196,NA,0,0,1,0,"Agriculture, Multidisciplinary",NA,NA,LITHUANIAN RESEARCH CENTRE AGRICULTURE & FORESTRY,NA +zentralblatt fur chirurgie,0044-409X,1438-9592,NA,0,0,1,0,Surgery,NA,NA,GEORG THIEME VERLAG KG,NA +zephyrus-revista de prehistoria y arqueologia,0514-7336,2386-3943,NA,1,0,0,0,NA,NA,Archaeology,"UNIV SALAMANCA, EDICIONES",NA +zhurnal obshchei biologii,0044-4596,NA,NA,0,0,1,0,Biology,NA,NA,MEZHDUNARODNAYA KNIGA,NA +zhurnal vysshei nervnoi deyatelnosti imeni i p pavlova,0044-4677,NA,NA,0,0,1,0,Neurosciences | Physiology,NA,NA,MEZHDUNARODNAYA KNIGA,NA +zivot umjetnosti,0514-7794,0514-7794,NA,1,0,0,0,NA,NA,Art,INST POVIJEST UMJETNOSTI-INST ART HISTORY,NA +zkg international,2366-1313,NA,NA,0,0,1,0,"Construction & Building Technology | Materials Science, Multidisciplinary",NA,NA,BAUVERLAG BV GMBH,NA +zograf,0350-1361,2406-0755,NA,1,0,0,0,NA,NA,Medieval & Renaissance Studies | Art,"UNIV BELGRADE, INST ART HISTORY, FACULTY PHILOSOPHY",NA +zoo biology,0733-3188,1098-2361,NA,0,0,1,0,Veterinary Sciences | Zoology,NA,NA,WILEY,NA +zookeys,1313-2989,1313-2970,ZooKeys_Journal,0,0,1,1,Zoology,NA,NA,PENSOFT PUBLISHERS,2010-10-24 +zoologia,1984-4689,1984-4689,Zoologia_journ,0,0,1,1,Zoology,NA,NA,"SOC BRASILEIRA ZOOLOGIA, UNIV FEDERAL PARANA",2016-12-23 +zoologica scripta,0300-3256,1463-6409,NA,0,0,1,0,Evolutionary Biology | Zoology,NA,NA,WILEY,NA +zoological journal of the linnean society,0024-4082,1096-3642,ZoolJLinnSoc,0,0,1,1,Zoology,NA,NA,OXFORD UNIV PRESS,2015-09-17 +zoological letters,2056-306X,2056-306X,NA,0,0,1,0,Zoology,NA,NA,BMC,NA +zoological research,2095-8137,NA,NA,0,0,1,0,Zoology,NA,NA,SCIENCE PRESS,NA +zoological science,0289-0003,0289-0003,NA,0,0,1,0,Zoology,NA,NA,ZOOLOGICAL SOC JAPAN,NA +zoological studies,1021-5506,1810-522X,ZooStudies,0,0,1,1,Zoology,NA,NA,"BIODIVERSITY RESEARCH CENTER, ACAD SINICA",2018-01-19 +zoologichesky zhurnal,0044-5134,NA,NA,0,0,1,0,Zoology,NA,NA,MAIK NAUKA-INTERPERIODICA PUBL,NA +zoologischer anzeiger,0044-5231,0044-5231,NA,0,0,1,0,Zoology,NA,NA,ELSEVIER GMBH,NA +zoology,0944-2006,1873-2720,NA,0,0,1,0,Zoology,NA,NA,ELSEVIER GMBH,NA +zoology in the middle east,0939-7140,2326-2680,NA,0,0,1,0,Zoology,NA,NA,TAYLOR & FRANCIS LTD,NA +zoomorphology,0720-213X,1432-234X,NA,0,0,1,0,Anatomy & Morphology | Zoology,NA,NA,SPRINGER,NA +zoonoses and public health,1863-1959,1863-2378,NA,0,0,1,0,Infectious Diseases | Veterinary Sciences,NA,NA,WILEY,NA +zoosystema,1280-9551,1638-9387,NA,0,0,1,0,Zoology,NA,NA,"PUBLICATIONS SCIENTIFIQUES DU MUSEUM, PARIS",NA +zoosystematics and evolution,1860-0743,1860-0743,NA,0,0,1,0,Zoology,NA,NA,PENSOFT PUBLISHERS,NA +zootaxa,1175-5326,1175-5334,Zootaxa,0,0,1,1,Zoology,NA,NA,MAGNOLIA PRESS,2009-11-01 +zuchtungskunde,0044-5401,1867-4518,NA,0,0,1,0,"Agriculture, Dairy & Animal Science",NA,NA,EUGEN ULMER GMBH CO,NA +zygon,0591-2385,1467-9744,Zygonjournal,1,1,0,1,NA,Social Issues,Religion,WILEY,2013-06-16 +zygon,0591-2385,1467-9744,Zygonjournal,1,1,0,1,NA,Social Issues,Religion,WILEY,2013-06-16 +zygote,0967-1994,1469-8730,NA,0,0,1,0,Cell Biology | Developmental Biology | Reproductive Biology,NA,NA,CAMBRIDGE UNIV PRESS,NA