1
0
mirror of https://github.com/msberends/AMR.git synced 2025-07-09 21:01:58 +02:00

14 Commits

51 changed files with 20595 additions and 866 deletions

View File

@ -1,6 +1,6 @@
Package: AMR Package: AMR
Version: 2.0.0 Version: 2.0.0.9014
Date: 2023-03-12 Date: 2023-05-08
Title: Antimicrobial Resistance Data Analysis Title: Antimicrobial Resistance Data Analysis
Description: Functions to simplify and standardise antimicrobial resistance (AMR) Description: Functions to simplify and standardise antimicrobial resistance (AMR)
data analysis and to work with microbial and antimicrobial properties by data analysis and to work with microbial and antimicrobial properties by

10
NEWS.md
View File

@ -1,3 +1,13 @@
# AMR 2.0.0.9014
## Changed
* formatting fix for `sir_interpretation_history()`
* Fixed some WHONET codes for microorganisms and consequently a couple of entries in `clinical_breakpoints`
* Added microbial codes for Gram-negative/positive anaerobic bacteria
* `mo_rank()` now returns `NA` for 'unknown' microorganisms (`B_ANAER`, `B_ANAER-NEG`, `B_ANAER-POS`, `B_GRAMN`, `B_GRAMP`, `F_FUNGUS`, `F_YEAST`, and `UNKNOWN`)
* Fixed a bug for `as.mo()` that led to coercion of `NA` values when using custom microorganism codes
# AMR 2.0.0 # AMR 2.0.0
This is a new major release of the AMR package, with great new additions but also some breaking changes for current users. These are all listed below. This is a new major release of the AMR package, with great new additions but also some breaking changes for current users. These are all listed below.

View File

@ -644,10 +644,13 @@ format_included_data_number <- function(data) {
rounder <- -3 # round on thousands rounder <- -3 # round on thousands
} else if (n > 1000) { } else if (n > 1000) {
rounder <- -2 # round on hundreds rounder <- -2 # round on hundreds
} else if (n < 50) {
# do not round
rounder <- 0
} else { } else {
rounder <- -1 # round on tens rounder <- -1 # round on tens
} }
paste0("~", format(round(n, rounder), decimal.mark = ".", big.mark = " ")) paste0(ifelse(rounder == 0, "", "~"), format(round(n, rounder), decimal.mark = ".", big.mark = " "))
} }
# for eucast_rules() and mdro(), creates markdown output with URLs and names # for eucast_rules() and mdro(), creates markdown output with URLs and names
@ -670,10 +673,15 @@ create_eucast_ab_documentation <- function() {
atcs <- ab_atc(ab, only_first = TRUE) atcs <- ab_atc(ab, only_first = TRUE)
# only keep ABx with an ATC code: # only keep ABx with an ATC code:
ab <- ab[!is.na(atcs)] ab <- ab[!is.na(atcs)]
atcs <- atcs[!is.na(atcs)]
# sort all vectors on name:
ab_names <- ab_name(ab, language = NULL, tolower = TRUE) ab_names <- ab_name(ab, language = NULL, tolower = TRUE)
ab <- ab[order(ab_names)] ab <- ab[order(ab_names)]
atcs <- atcs[order(ab_names)]
ab_names <- ab_names[order(ab_names)] ab_names <- ab_names[order(ab_names)]
atc_txt <- paste0("[", atcs[!is.na(atcs)], "](", ab_url(ab), ")") # create the text:
atc_txt <- paste0("[", atcs, "](", ab_url(ab), ")")
out <- paste0(ab_names, " (`", ab, "`, ", atc_txt, ")", collapse = ", ") out <- paste0(ab_names, " (`", ab, "`, ", atc_txt, ")", collapse = ", ")
substr(out, 1, 1) <- toupper(substr(out, 1, 1)) substr(out, 1, 1) <- toupper(substr(out, 1, 1))
out out

View File

@ -224,7 +224,7 @@
#' # in an Rmd file, you would just need to return `ureido` in a chunk, #' # in an Rmd file, you would just need to return `ureido` in a chunk,
#' # but to be explicit here: #' # but to be explicit here:
#' if (requireNamespace("knitr")) { #' if (requireNamespace("knitr")) {
#' knitr::knit_print(ureido) #' cat(knitr::knit_print(ureido))
#' } #' }
#' #'
#' #'

View File

@ -120,12 +120,12 @@
#' ### Manual additions #' ### Manual additions
#' For convenience, some entries were added manually: #' For convenience, some entries were added manually:
#' #'
#' - `r format_included_data_number(which(microorganisms$genus == "Salmonella" & microorganisms$species == "enterica" & microorganisms$source == "manually added"))` entries for the city-like serovars of *Salmonellae* #' - `r format_included_data_number(microorganisms[which(microorganisms$source == "manually added" & microorganisms$genus == "Salmonella"), , drop = FALSE])` entries of *Salmonella*, such as the city-like serovars and groups A to H
#' - 11 entries of *Streptococcus* (beta-haemolytic: groups A, B, C, D, F, G, H, K and unspecified; other: viridans, milleri) #' - `r format_included_data_number(microorganisms[which(microorganisms$source == "manually added" & microorganisms$genus == "Streptococcus"), , drop = FALSE])` entries of *Streptococcus*, such as the beta-haemolytic groups A to K, viridans, and milleri
#' - 2 entries of *Staphylococcus* (coagulase-negative (CoNS) and coagulase-positive (CoPS)) #' - 2 entries of *Staphylococcus* (coagulase-negative (CoNS) and coagulase-positive (CoPS))
#' - 1 entry of *Blastocystis* (*B. hominis*), although it officially does not exist (Noel *et al.* 2005, PMID 15634993) #' - 1 entry of *Blastocystis* (*B. hominis*), although it officially does not exist (Noel *et al.* 2005, PMID 15634993)
#' - 1 entry of *Moraxella* (*M. catarrhalis*), which was formally named *Branhamella catarrhalis* (Catlin, 1970) though this change was never accepted within the field of clinical microbiology #' - 1 entry of *Moraxella* (*M. catarrhalis*), which was formally named *Branhamella catarrhalis* (Catlin, 1970) though this change was never accepted within the field of clinical microbiology
#' - 6 other 'undefined' entries (unknown, unknown Gram negatives, unknown Gram positives, unknown yeast, unknown fungus, and unknown anaerobic bacteria) #' - 8 other 'undefined' entries (unknown, unknown Gram-negatives, unknown Gram-positives, unknown yeast, unknown fungus, and unknown anaerobic Gram-pos/Gram-neg bacteria)
#' #'
#' The syntax used to transform the original data to a cleansed \R format, can be found here: <https://github.com/msberends/AMR/blob/main/data-raw/reproduction_of_microorganisms.R>. #' The syntax used to transform the original data to a cleansed \R format, can be found here: <https://github.com/msberends/AMR/blob/main/data-raw/reproduction_of_microorganisms.R>.
#' #'

View File

@ -57,7 +57,7 @@ italicise_taxonomy <- function(string, type = c("markdown", "ansi")) {
before <- "*" before <- "*"
after <- "*" after <- "*"
} else if (type == "ansi") { } else if (type == "ansi") {
if (!has_colour()) { if (!has_colour() && !identical(Sys.getenv("IN_PKGDOWN"), "true")) {
return(string) return(string)
} }
before <- "\033[3m" before <- "\033[3m"

View File

@ -49,6 +49,9 @@
#' @seealso [grepl()] #' @seealso [grepl()]
#' @examples #' @examples
#' # data.table has a more limited version of %like%, so unload it:
#' try(detach("package:data.table", unload = TRUE), silent = TRUE)
#'
#' a <- "This is a test" #' a <- "This is a test"
#' b <- "TEST" #' b <- "TEST"
#' a %like% b #' a %like% b

51
R/mo.R
View File

@ -214,10 +214,10 @@ as.mo <- function(x,
# From known codes ---- # From known codes ----
out[is.na(out) & toupper(x) %in% AMR::microorganisms.codes$code] <- AMR::microorganisms.codes$mo[match(toupper(x)[is.na(out) & toupper(x) %in% AMR::microorganisms.codes$code], AMR::microorganisms.codes$code)] out[is.na(out) & toupper(x) %in% AMR::microorganisms.codes$code] <- AMR::microorganisms.codes$mo[match(toupper(x)[is.na(out) & toupper(x) %in% AMR::microorganisms.codes$code], AMR::microorganisms.codes$code)]
# From SNOMED ---- # From SNOMED ----
if (any(is.na(out) & !is.na(x)) && any(is.na(out) & x %in% unlist(AMR_env$MO_lookup$snomed), na.rm = TRUE)) { # based on this extremely fast gem: https://stackoverflow.com/a/11002456/4575331
# found this extremely fast gem here: https://stackoverflow.com/a/11002456/4575331 snomeds <- unlist(AMR_env$MO_lookup$snomed)
out[is.na(out) & x %in% unlist(AMR_env$MO_lookup$snomed)] <- AMR_env$MO_lookup$mo[rep(seq_along(AMR_env$MO_lookup$snomed), vapply(FUN.VALUE = double(1), AMR_env$MO_lookup$snomed, length))[match(x[is.na(out) & x %in% unlist(AMR_env$MO_lookup$snomed)], unlist(AMR_env$MO_lookup$snomed))]] snomeds <- snomeds[!is.na(snomeds)]
} out[is.na(out) & x %in% snomeds] <- AMR_env$MO_lookup$mo[rep(seq_along(AMR_env$MO_lookup$snomed), vapply(FUN.VALUE = double(1), AMR_env$MO_lookup$snomed, length))[match(x[is.na(out) & x %in% snomeds], snomeds)]]
# From other familiar output ---- # From other familiar output ----
# such as Salmonella groups, colloquial names, etc. # such as Salmonella groups, colloquial names, etc.
out[is.na(out)] <- convert_colloquial_input(x[is.na(out)]) out[is.na(out)] <- convert_colloquial_input(x[is.na(out)])
@ -547,7 +547,7 @@ mo_cleaning_regex <- function() {
"|", "|",
"([({]|\\[).+([})]|\\])", "([({]|\\[).+([})]|\\])",
"|", "|",
"(^| )(e?spp|e?ssp|e?ss|e?sp|e?subsp|sube?species|biovar|biotype|serovar|serogr.?up|e?species)[.]*( |$|(complex|group)$))" "(^| )(e?spp|e?ssp|e?ss|e?sp|e?subsp|sube?species|biovar|biotype|serovar|var|serogr.?up|e?species)[.]*( |$|(complex|group)$))"
) )
} }
@ -947,25 +947,25 @@ convert_colloquial_input <- function(x) {
out <- rep(NA_character_, length(x)) out <- rep(NA_character_, length(x))
# Streptococci, like GBS = Group B Streptococci (B_STRPT_GRPB) # Streptococci, like GBS = Group B Streptococci (B_STRPT_GRPB)
out[x %like_case% "^g[abcdfghkl]s$"] <- gsub("g([abcdfghkl])s", out[x %like_case% "^g[abcdefghijkl]s$"] <- gsub("g([abcdefghijkl])s",
"B_STRPT_GRP\\U\\1", "B_STRPT_GRP\\U\\1",
x[x %like_case% "^g[abcdfghkl]s$"], x[x %like_case% "^g[abcdefghijkl]s$"],
perl = TRUE perl = TRUE
) )
# Streptococci in different languages, like "estreptococos grupo B" # Streptococci in different languages, like "estreptococos grupo B"
out[x %like_case% "strepto[ck]o[ck].* [abcdfghkl]$"] <- gsub(".*e?strepto[ck]o[ck].* ([abcdfghkl])$", out[x %like_case% "strepto[ck]o[ck].* [abcdefghijkl]$"] <- gsub(".*e?strepto[ck]o[ck].* ([abcdefghijkl])$",
"B_STRPT_GRP\\U\\1", "B_STRPT_GRP\\U\\1",
x[x %like_case% "strepto[ck]o[ck].* [abcdfghkl]$"], x[x %like_case% "strepto[ck]o[ck].* [abcdefghijkl]$"],
perl = TRUE perl = TRUE
) )
out[x %like_case% "strep[a-z]* group [abcdfghkl]$"] <- gsub(".* ([abcdfghkl])$", out[x %like_case% "strep[a-z]* group [abcdefghijkl]$"] <- gsub(".* ([abcdefghijkl])$",
"B_STRPT_GRP\\U\\1", "B_STRPT_GRP\\U\\1",
x[x %like_case% "strep[a-z]* group [abcdfghkl]$"], x[x %like_case% "strep[a-z]* group [abcdefghijkl]$"],
perl = TRUE perl = TRUE
) )
out[x %like_case% "group [abcdfghkl] strepto[ck]o[ck]"] <- gsub(".*group ([abcdfghkl]) strepto[ck]o[ck].*", out[x %like_case% "group [abcdefghijkl] strepto[ck]o[ck]"] <- gsub(".*group ([abcdefghijkl]) strepto[ck]o[ck].*",
"B_STRPT_GRP\\U\\1", "B_STRPT_GRP\\U\\1",
x[x %like_case% "group [abcdfghkl] strepto[ck]o[ck]"], x[x %like_case% "group [abcdefghijkl] strepto[ck]o[ck]"],
perl = TRUE perl = TRUE
) )
out[x %like_case% "ha?emoly.*strep"] <- "B_STRPT_HAEM" out[x %like_case% "ha?emoly.*strep"] <- "B_STRPT_HAEM"
@ -975,14 +975,14 @@ convert_colloquial_input <- function(x) {
out[x %like_case% "(viridans.* (strepto|^s).*|^vgs[^a-z]*$)"] <- "B_STRPT_VIRI" out[x %like_case% "(viridans.* (strepto|^s).*|^vgs[^a-z]*$)"] <- "B_STRPT_VIRI"
# Salmonella in different languages, like "Salmonella grupo B" # Salmonella in different languages, like "Salmonella grupo B"
out[x %like_case% "salmonella.* [abcd]$"] <- gsub(".*salmonella.* ([abcd])$", out[x %like_case% "salmonella.* [abcdefgh]$"] <- gsub(".*salmonella.* ([abcdefgh])$",
"B_SLMNL_GRP\\U\\1", "B_SLMNL_GRP\\U\\1",
x[x %like_case% "salmonella.* [abcd]$"], x[x %like_case% "salmonella.* [abcdefgh]$"],
perl = TRUE perl = TRUE
) )
out[x %like_case% "group [abcd] salmonella"] <- gsub(".*group ([abcd]) salmonella*", out[x %like_case% "group [abcdefgh] salmonella"] <- gsub(".*group ([abcdefgh]) salmonella*",
"B_SLMNL_GRP\\U\\1", "B_SLMNL_GRP\\U\\1",
x[x %like_case% "group [abcd] salmonella"], x[x %like_case% "group [abcdefgh] salmonella"],
perl = TRUE perl = TRUE
) )
@ -995,8 +995,10 @@ convert_colloquial_input <- function(x) {
out[x %like_case% "( |^)gram[-]( |$)"] <- "B_GRAMN" out[x %like_case% "( |^)gram[-]( |$)"] <- "B_GRAMN"
out[x %like_case% "gram[ -]?pos.*"] <- "B_GRAMP" out[x %like_case% "gram[ -]?pos.*"] <- "B_GRAMP"
out[x %like_case% "( |^)gram[+]( |$)"] <- "B_GRAMP" out[x %like_case% "( |^)gram[+]( |$)"] <- "B_GRAMP"
out[x %like_case% "anaerob[a-z]+ .*gram[ -]?neg.*"] <- "B_ANAER-NEG"
out[x %like_case% "anaerob[a-z]+ .*gram[ -]?pos.*"] <- "B_ANAER-POS"
out[is.na(out) & x %like_case% "anaerob[a-z]+ (micro)?.*organism"] <- "B_ANAER" out[is.na(out) & x %like_case% "anaerob[a-z]+ (micro)?.*organism"] <- "B_ANAER"
# yeasts and fungi # yeasts and fungi
out[x %like_case% "^yeast?"] <- "F_YEAST" out[x %like_case% "^yeast?"] <- "F_YEAST"
out[x %like_case% "^fung(us|i)"] <- "F_FUNGUS" out[x %like_case% "^fung(us|i)"] <- "F_FUNGUS"
@ -1006,7 +1008,7 @@ convert_colloquial_input <- function(x) {
out[x %like_case% "gono[ck]o[ck]"] <- "B_NESSR_GNRR" out[x %like_case% "gono[ck]o[ck]"] <- "B_NESSR_GNRR"
out[x %like_case% "pneumo[ck]o[ck]"] <- "B_STRPT_PNMN" out[x %like_case% "pneumo[ck]o[ck]"] <- "B_STRPT_PNMN"
# unexisting names (xxx and con are WHONET codes) # unexisting names (con is the WHONET code for contamination)
out[x %in% c("con", "other", "none", "unknown") | x %like_case% "virus"] <- "UNKNOWN" out[x %in% c("con", "other", "none", "unknown") | x %like_case% "virus"] <- "UNKNOWN"
# WHONET has a lot of E. coli and Vibrio cholerae names # WHONET has a lot of E. coli and Vibrio cholerae names
@ -1017,18 +1019,23 @@ convert_colloquial_input <- function(x) {
} }
italicise <- function(x) { italicise <- function(x) {
if (!has_colour()) {
return(x)
}
out <- font_italic(x, collapse = NULL) out <- font_italic(x, collapse = NULL)
# city-like serovars of Salmonella (start with a capital)
out[x %like_case% "Salmonella [A-Z]"] <- paste( out[x %like_case% "Salmonella [A-Z]"] <- paste(
font_italic("Salmonella"), font_italic("Salmonella"),
gsub("Salmonella ", "", x[x %like_case% "Salmonella [A-Z]"]) gsub("Salmonella ", "", x[x %like_case% "Salmonella [A-Z]"])
) )
# streptococcal groups
out[x %like_case% "Streptococcus [A-Z]"] <- paste( out[x %like_case% "Streptococcus [A-Z]"] <- paste(
font_italic("Streptococcus"), font_italic("Streptococcus"),
gsub("Streptococcus ", "", x[x %like_case% "Streptococcus [A-Z]"]) gsub("Streptococcus ", "", x[x %like_case% "Streptococcus [A-Z]"])
) )
if (has_colour()) { # be sure not to make these italic
out <- gsub("(Group|group|Complex|complex)(\033\\[23m)?", "\033[23m\\1", out, perl = TRUE) out <- gsub("([ -]*)(Group|group|Complex|complex)(\033\\[23m)?", "\033[23m\\1\\2", out, perl = TRUE)
} out <- gsub("(\033\\[3m)?(Beta[-]haemolytic|Coagulase[-](postive|negative)) ", "\\2 \033[3m", out, perl = TRUE)
out out
} }

View File

@ -480,7 +480,7 @@ mo_gramstain <- function(x, language = get_AMR_locale(), keep_synonyms = getOpti
# but class Negativicutes (of phylum Bacillota) are Gram-negative! # but class Negativicutes (of phylum Bacillota) are Gram-negative!
mo_class(x.mo, language = NULL, keep_synonyms = keep_synonyms) != "Negativicutes") mo_class(x.mo, language = NULL, keep_synonyms = keep_synonyms) != "Negativicutes")
# and of course our own ID for Gram-positives # and of course our own ID for Gram-positives
| x.mo == "B_GRAMP"] <- "Gram-positive" | x.mo %in% c("B_GRAMP", "B_ANAER-POS")] <- "Gram-positive"
load_mo_uncertainties(metadata) load_mo_uncertainties(metadata)
translate_into_language(x, language = language, only_unknown = FALSE) translate_into_language(x, language = language, only_unknown = FALSE)

Binary file not shown.

View File

@ -59,16 +59,15 @@ AMR_env$sir_interpretation_history <- data.frame(
datetime = Sys.time()[0], datetime = Sys.time()[0],
index = integer(0), index = integer(0),
ab_input = character(0), ab_input = character(0),
ab_considered = character(0), ab_guideline = set_clean_class(character(0), c("ab", "character")),
mo_input = character(0), mo_input = character(0),
mo_considered = character(0), mo_guideline = set_clean_class(character(0), c("mo", "character")),
guideline = character(0), guideline = character(0),
ref_table = character(0), ref_table = character(0),
method = character(0), method = character(0),
breakpoint_S = double(0),
breakpoint_R = double(0),
input = double(0), input = double(0),
interpretation = character(0), outcome = NA_sir_[0],
breakpoint_S_R = character(0),
stringsAsFactors = FALSE stringsAsFactors = FALSE
) )
AMR_env$custom_ab_codes <- character(0) AMR_env$custom_ab_codes <- character(0)

View File

@ -31,6 +31,7 @@
# source("data-raw/_pre_commit_hook.R") # source("data-raw/_pre_commit_hook.R")
library(dplyr, warn.conflicts = FALSE) library(dplyr, warn.conflicts = FALSE)
try(detach("package:data.table", unload = TRUE), silent = TRUE) # to prevent like() to precede over AMR::like
devtools::load_all(quiet = TRUE) devtools::load_all(quiet = TRUE)
suppressMessages(set_AMR_locale("English")) suppressMessages(set_AMR_locale("English"))
@ -164,12 +165,12 @@ MO_PREVALENT_GENERA <- c(
"Halococcus", "Hendersonula", "Heterophyes", "Histomonas", "Histoplasma", "Hymenolepis", "Hypomyces", "Halococcus", "Hendersonula", "Heterophyes", "Histomonas", "Histoplasma", "Hymenolepis", "Hypomyces",
"Hysterothylacium", "Leishmania", "Malassezia", "Malbranchea", "Metagonimus", "Meyerozyma", "Microsporidium", "Hysterothylacium", "Leishmania", "Malassezia", "Malbranchea", "Metagonimus", "Meyerozyma", "Microsporidium",
"Microsporum", "Mortierella", "Mucor", "Mycocentrospora", "Necator", "Nectria", "Ochroconis", "Oesophagostomum", "Microsporum", "Mortierella", "Mucor", "Mycocentrospora", "Necator", "Nectria", "Ochroconis", "Oesophagostomum",
"Oidiodendron", "Opisthorchis", "Pediculus", "Phlebotomus", "Phoma", "Pichia", "Piedraia", "Pithomyces", "Oidiodendron", "Opisthorchis", "Pediculus", "Penicillium", "Phlebotomus", "Phoma", "Pichia", "Piedraia", "Pithomyces",
"Pityrosporum", "Pneumocystis", "Pseudallescheria", "Pseudoterranova", "Pulex", "Rhizomucor", "Rhizopus", "Pityrosporum", "Pneumocystis", "Pseudallescheria", "Pseudoterranova", "Pulex", "Rhizomucor", "Rhizopus",
"Rhodotorula", "Saccharomyces", "Sarcoptes", "Scolecobasidium", "Scopulariopsis", "Scytalidium", "Spirometra", "Rhodotorula", "Saccharomyces", "Sarcoptes", "Scolecobasidium", "Scopulariopsis", "Scytalidium", "Spirometra",
"Sporobolomyces", "Stachybotrys", "Strongyloides", "Syngamus", "Taenia", "Toxocara", "Trichinella", "Trichobilharzia", "Sporobolomyces", "Stachybotrys", "Strongyloides", "Syngamus", "Taenia", "Talaromyces", "Toxocara", "Trichinella",
"Trichoderma", "Trichomonas", "Trichophyton", "Trichosporon", "Trichostrongylus", "Trichuris", "Tritirachium", "Trichobilharzia", "Trichoderma", "Trichomonas", "Trichophyton", "Trichosporon", "Trichostrongylus", "Trichuris",
"Trombicula", "Trypanosoma", "Tunga", "Wuchereria" "Tritirachium", "Trombicula", "Trypanosoma", "Tunga", "Wuchereria"
) )
# antibiotic groups # antibiotic groups

19616
data-raw/bacdive.csv Normal file

File diff suppressed because it is too large Load Diff

View File

@ -1 +1 @@
68467f5179638ac5622281df53a5ea75 0a9ea3545d68b95108a28096d975388f

Binary file not shown.

Binary file not shown.

Binary file not shown.

Binary file not shown.

File diff suppressed because it is too large Load Diff

Binary file not shown.

Binary file not shown.

Binary file not shown.

View File

@ -1 +1 @@
7846247d4113c4e8f550cfd2cb87467f 20bb7a68431826bce777a6c239f0fed0

Binary file not shown.

Binary file not shown.

Binary file not shown.

Binary file not shown.

View File

@ -1,10 +1,12 @@
"mo" "fullname" "status" "kingdom" "phylum" "class" "order" "family" "genus" "species" "subspecies" "rank" "ref" "source" "lpsn" "lpsn_parent" "lpsn_renamed_to" "gbif" "gbif_parent" "gbif_renamed_to" "prevalence" "snomed" "mo" "fullname" "status" "kingdom" "phylum" "class" "order" "family" "genus" "species" "subspecies" "rank" "ref" "source" "lpsn" "lpsn_parent" "lpsn_renamed_to" "gbif" "gbif_parent" "gbif_renamed_to" "prevalence" "snomed"
"B_GRAMN" "(unknown Gram-negatives)" "accepted" "Bacteria" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown Gram-negatives)" "(unknown species)" "(unknown subspecies)" "subspecies" "manually added" 2 "" "B_ANAER" "(unknown anaerobic bacteria)" "accepted" "Bacteria" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "manually added" 2 ""
"B_GRAMP" "(unknown Gram-positives)" "accepted" "Bacteria" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown Gram-positives)" "(unknown species)" "(unknown subspecies)" "subspecies" "manually added" 2 "" "B_ANAER-NEG" "(unknown anaerobic Gram-negatives)" "accepted" "Bacteria" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "manually added" 2 ""
"B_ANAER" "(unknown anaerobic bacteria)" "accepted" "Bacteria" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown Gram-negatives)" "(unknown species)" "(unknown subspecies)" "subspecies" "manually added" 2 "" "B_ANAER-POS" "(unknown anaerobic Gram-positives)" "accepted" "Bacteria" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "manually added" 2 ""
"F_FUNGUS" "(unknown fungus)" "accepted" "Fungi" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "subspecies" "manually added" 2 "" "F_FUNGUS" "(unknown fungus)" "accepted" "Fungi" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "manually added" 2 ""
"UNKNOWN" "(unknown name)" "accepted" "(unknown kingdom)" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "subspecies" "manually added" 2 "" "B_GRAMN" "(unknown Gram-negatives)" "accepted" "Bacteria" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "manually added" 2 ""
"F_YEAST" "(unknown yeast)" "accepted" "Fungi" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "subspecies" "manually added" 2 "" "B_GRAMP" "(unknown Gram-positives)" "accepted" "Bacteria" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "manually added" 2 ""
"UNKNOWN" "(unknown name)" "accepted" "(unknown kingdom)" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "manually added" 2 ""
"F_YEAST" "(unknown yeast)" "accepted" "Fungi" "(unknown phylum)" "(unknown class)" "(unknown order)" "(unknown family)" "(unknown genus)" "(unknown species)" "(unknown subspecies)" "manually added" 2 ""
"B_[FAM]_ABDTBCTR" "Abditibacteriaceae" "accepted" "Bacteria" "Abditibacteriota" "Abditibacteriia" "Abditibacteriales" "Abditibacteriaceae" "" "" "" "family" "Tahon et al., 2018" "LPSN" "4812" "4982" "10678443" "10853930" 2 "" "B_[FAM]_ABDTBCTR" "Abditibacteriaceae" "accepted" "Bacteria" "Abditibacteriota" "Abditibacteriia" "Abditibacteriales" "Abditibacteriaceae" "" "" "" "family" "Tahon et al., 2018" "LPSN" "4812" "4982" "10678443" "10853930" 2 ""
"B_[ORD]_ABDTBCTR" "Abditibacteriales" "accepted" "Bacteria" "Abditibacteriota" "Abditibacteriia" "Abditibacteriales" "" "" "" "" "order" "Tahon et al., 2018" "LPSN" "4982" "29679" "10853930" 2 "" "B_[ORD]_ABDTBCTR" "Abditibacteriales" "accepted" "Bacteria" "Abditibacteriota" "Abditibacteriia" "Abditibacteriales" "" "" "" "" "order" "Tahon et al., 2018" "LPSN" "4982" "29679" "10853930" 2 ""
"B_[CLS]_ADTBCTRA" "Abditibacteriia" "accepted" "Bacteria" "Abditibacteriota" "Abditibacteriia" "" "" "" "" "" "class" "Tahon et al., 2018" "LPSN" "29679" "774" 2 "" "B_[CLS]_ADTBCTRA" "Abditibacteriia" "accepted" "Bacteria" "Abditibacteriota" "Abditibacteriia" "" "" "" "" "" "class" "Tahon et al., 2018" "LPSN" "29679" "774" 2 ""
@ -6477,7 +6479,6 @@
"B_AZYRT" "Azyrtalia" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Rivulariaceae" "Azyrtalia" "" "" "genus" "Vologdin et al., 1969" "GBIF" "3237706" "4306626" 2 "" "B_AZYRT" "Azyrtalia" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Rivulariaceae" "Azyrtalia" "" "" "genus" "Vologdin et al., 1969" "GBIF" "3237706" "4306626" 2 ""
"B_AZYRT_ZNLT" "Azyrtalia zonulata" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Rivulariaceae" "Azyrtalia" "zonulata" "" "species" "Vologdin et al., 1969" "GBIF" "11176322" "3237706" 2 "" "B_AZYRT_ZNLT" "Azyrtalia zonulata" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Rivulariaceae" "Azyrtalia" "zonulata" "" "species" "Vologdin et al., 1969" "GBIF" "11176322" "3237706" 2 ""
"A_B-DKE" "B-DKE" "accepted" "Archaea" "Euryarchaeota" "Thermoplasmata" "Thermoplasmatales" "Thermoplasmataceae" "B-DKE" "" "" "genus" "GBIF" "11214677" "3810" 2 "" "A_B-DKE" "B-DKE" "accepted" "Archaea" "Euryarchaeota" "Thermoplasmata" "Thermoplasmatales" "Thermoplasmataceae" "B-DKE" "" "" "genus" "GBIF" "11214677" "3810" 2 ""
"A_BE-D" "BE-D" "accepted" "Archaea" "Thermoproteota" "Thermoproteia" "Marsarchaeales" "Marsarchaeaceae" "BE-D" "" "" "genus" "GBIF" "11119914" "10885120" 2 ""
"B_BABEL" "Babela" "accepted" "Bacteria" "Dependentiae" "Babeliae" "Babeliales" "Babeliaceae" "Babela" "" "" "genus" "GBIF" "10699249" "10857700" 2 "" "B_BABEL" "Babela" "accepted" "Bacteria" "Dependentiae" "Babeliae" "Babeliales" "Babeliaceae" "Babela" "" "" "genus" "GBIF" "10699249" "10857700" 2 ""
"B_BABEL_MSSL" "Babela massiliensis" "accepted" "Bacteria" "Dependentiae" "Babeliae" "Babeliales" "Babeliaceae" "Babela" "massiliensis" "" "species" "GBIF" "10816215" "10699249" 2 "" "B_BABEL_MSSL" "Babela massiliensis" "accepted" "Bacteria" "Dependentiae" "Babeliae" "Babeliales" "Babeliaceae" "Babela" "massiliensis" "" "species" "GBIF" "10816215" "10699249" 2 ""
"B_[FAM]_BABELIAC" "Babeliaceae" "accepted" "Bacteria" "Dependentiae" "Babeliae" "Babeliales" "Babeliaceae" "" "" "" "family" "GBIF" "10857700" "10791973" 2 "" "B_[FAM]_BABELIAC" "Babeliaceae" "accepted" "Bacteria" "Dependentiae" "Babeliae" "Babeliales" "Babeliaceae" "" "" "" "family" "GBIF" "10857700" "10791973" 2 ""
@ -7289,6 +7290,7 @@
"B_BDLLV_STLP" "Bdellovibrio stolpii" "synonym" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "Bdellovibrionaceae" "Bdellovibrio" "stolpii" "" "species" "Seidler et al., 1972" "LPSN" "773991" "516977" "773917" 2 "9752009" "B_BDLLV_STLP" "Bdellovibrio stolpii" "synonym" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "Bdellovibrionaceae" "Bdellovibrio" "stolpii" "" "species" "Seidler et al., 1972" "LPSN" "773991" "516977" "773917" 2 "9752009"
"B_[FAM]_BDLLVBRN" "Bdellovibrionaceae" "accepted" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "Bdellovibrionaceae" "" "" "" "family" "Garrity et al., 2006" "LPSN" "203" "5078" "8932" "652" 2 "427516001" "B_[FAM]_BDLLVBRN" "Bdellovibrionaceae" "accepted" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "Bdellovibrionaceae" "" "" "" "family" "Garrity et al., 2006" "LPSN" "203" "5078" "8932" "652" 2 "427516001"
"B_[ORD]_BDLLVBRN" "Bdellovibrionales" "accepted" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "" "" "" "" "order" "Garrity et al., 2006" "LPSN" "5078" "111" "652" "10808561" 2 "426331002" "B_[ORD]_BDLLVBRN" "Bdellovibrionales" "accepted" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "" "" "" "" "order" "Garrity et al., 2006" "LPSN" "5078" "111" "652" "10808561" 2 "426331002"
"A_BE-D" "BE-D" "accepted" "Archaea" "Thermoproteota" "Thermoproteia" "Marsarchaeales" "Marsarchaeaceae" "BE-D" "" "" "genus" "GBIF" "11119914" "10885120" 2 ""
"F_BEAVR" "Beauveria" "accepted" "Fungi" "Ascomycota" "Sordariomycetes" "Hypocreales" "Cordycipitaceae" "Beauveria" "" "" "genus" "Vuill, 1912" "GBIF" "2560584" "8418" 1.5 "66193005" "F_BEAVR" "Beauveria" "accepted" "Fungi" "Ascomycota" "Sordariomycetes" "Hypocreales" "Cordycipitaceae" "Beauveria" "" "" "genus" "Vuill, 1912" "GBIF" "2560584" "8418" 1.5 "66193005"
"F_BEAVR_ACRD" "Beauveria acridophila" "accepted" "Fungi" "Ascomycota" "Sordariomycetes" "Hypocreales" "Cordycipitaceae" "Beauveria" "acridophila" "" "species" "Sanjuan et al." "GBIF" "10753468" "2560584" 1.5 "" "F_BEAVR_ACRD" "Beauveria acridophila" "accepted" "Fungi" "Ascomycota" "Sordariomycetes" "Hypocreales" "Cordycipitaceae" "Beauveria" "acridophila" "" "species" "Sanjuan et al." "GBIF" "10753468" "2560584" 1.5 ""
"F_BEAVR_AMRP" "Beauveria amorpha" "accepted" "Fungi" "Ascomycota" "Sordariomycetes" "Hypocreales" "Cordycipitaceae" "Beauveria" "amorpha" "" "species" "Minnis et al." "GBIF" "7417312" "2560584" 1.5 "" "F_BEAVR_AMRP" "Beauveria amorpha" "accepted" "Fungi" "Ascomycota" "Sordariomycetes" "Hypocreales" "Cordycipitaceae" "Beauveria" "amorpha" "" "species" "Minnis et al." "GBIF" "7417312" "2560584" 1.5 ""
@ -19169,7 +19171,6 @@
"B_FSBCTR_VARM" "Fusobacterium varium" "accepted" "Bacteria" "Fusobacteriota" "Fusobacteriia" "Fusobacteriales" "Fusobacteriaceae" "Fusobacterium" "varium" "" "species" "Moore et al., 1969" "LPSN" "783893" "515666" "3225872" "4903731" 1 "1972005" "B_FSBCTR_VARM" "Fusobacterium varium" "accepted" "Bacteria" "Fusobacteriota" "Fusobacteriia" "Fusobacteriales" "Fusobacteriaceae" "Fusobacterium" "varium" "" "species" "Moore et al., 1969" "LPSN" "783893" "515666" "3225872" "4903731" 1 "1972005"
"B_FSBCTR_VNCN" "Fusobacterium vincentii" "accepted" "Bacteria" "Fusobacteriota" "Fusobacteriia" "Fusobacteriales" "Fusobacteriaceae" "Fusobacterium" "vincentii" "" "species" "Kook et al., 2022" "LPSN" "28103" "515666" "10808231" "4903731" 1.5 "" "B_FSBCTR_VNCN" "Fusobacterium vincentii" "accepted" "Bacteria" "Fusobacteriota" "Fusobacteriia" "Fusobacteriales" "Fusobacteriaceae" "Fusobacterium" "vincentii" "" "species" "Kook et al., 2022" "LPSN" "28103" "515666" "10808231" "4903731" 1.5 ""
"B_FSBCTR_WTNB" "Fusobacterium watanabei" "accepted" "Bacteria" "Fusobacteriota" "Fusobacteriia" "Fusobacteriales" "Fusobacteriaceae" "Fusobacterium" "watanabei" "" "species" "Tomida et al., 2021" "LPSN" "17647" "515666" 1.5 "" "B_FSBCTR_WTNB" "Fusobacterium watanabei" "accepted" "Bacteria" "Fusobacteriota" "Fusobacteriia" "Fusobacteriales" "Fusobacteriaceae" "Fusobacterium" "watanabei" "" "species" "Tomida et al., 2021" "LPSN" "17647" "515666" 1.5 ""
"B_GBCHB" "GBChlB" "accepted" "Bacteria" "Chlorobiota" "Chlorobiia" "Chlorobiales" "Chloroherpetonaceae" "GBChlB" "" "" "genus" "GBIF" "11171983" "10775177" 2 ""
"B_GBNBC" "Gabonibacter" "accepted" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Odoribacteraceae" "Gabonibacter" "" "" "genus" "Mourembou et al., 2017" "LPSN" "519111" "2047" "9240178" 2 "785729002" "B_GBNBC" "Gabonibacter" "accepted" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Odoribacteraceae" "Gabonibacter" "" "" "genus" "Mourembou et al., 2017" "LPSN" "519111" "2047" "9240178" 2 "785729002"
"B_GBNBC_JSTS" "Gabonibacter justesenii" "synonym" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Odoribacteraceae" "Gabonibacter" "justesenii" "" "species" "GBIF" "11090238" "9240178" "9415109" 2 "" "B_GBNBC_JSTS" "Gabonibacter justesenii" "synonym" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Odoribacteraceae" "Gabonibacter" "justesenii" "" "species" "GBIF" "11090238" "9240178" "9415109" 2 ""
"B_GBNBC_MSSL" "Gabonibacter massiliensis" "accepted" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Odoribacteraceae" "Gabonibacter" "massiliensis" "" "species" "Mourembou et al., 2017" "LPSN" "795002" "519111" "9415109" "9240178" 2 "" "B_GBNBC_MSSL" "Gabonibacter massiliensis" "accepted" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Odoribacteraceae" "Gabonibacter" "massiliensis" "" "species" "Mourembou et al., 2017" "LPSN" "795002" "519111" "9415109" "9240178" 2 ""
@ -19283,6 +19284,7 @@
"B_GSTRN_PHSC" "Gastranaerophilus phascolarctosicola" "accepted" "Bacteria" "Cyanobacteria" "Vampirovibrionia" "Gastranaerophilales" "Gastranaerophilaceae" "Gastranaerophilus" "phascolarctosicola" "" "species" "GBIF" "10876363" "10700903" 2 "" "B_GSTRN_PHSC" "Gastranaerophilus phascolarctosicola" "accepted" "Bacteria" "Cyanobacteria" "Vampirovibrionia" "Gastranaerophilales" "Gastranaerophilaceae" "Gastranaerophilus" "phascolarctosicola" "" "species" "GBIF" "10876363" "10700903" 2 ""
"P_GDRYN" "Gaudryina" "accepted" "Protozoa" "Sarcomastigophora" "" "" "Verneulidae" "Gaudryina" "" "" "genus" "GBIF" "10167887" "6123475" 2 "" "P_GDRYN" "Gaudryina" "accepted" "Protozoa" "Sarcomastigophora" "" "" "Verneulidae" "Gaudryina" "" "" "genus" "GBIF" "10167887" "6123475" 2 ""
"P_GDRYN_KKSN" "Gaudryina kokuseiensis" "accepted" "Protozoa" "Sarcomastigophora" "" "" "Verneulidae" "Gaudryina" "kokuseiensis" "" "species" "Ishizaki" "GBIF" "6123479" "10167887" 2 "" "P_GDRYN_KKSN" "Gaudryina kokuseiensis" "accepted" "Protozoa" "Sarcomastigophora" "" "" "Verneulidae" "Gaudryina" "kokuseiensis" "" "species" "Ishizaki" "GBIF" "6123479" "10167887" 2 ""
"B_GBCHB" "GBChlB" "accepted" "Bacteria" "Chlorobiota" "Chlorobiia" "Chlorobiales" "Chloroherpetonaceae" "GBChlB" "" "" "genus" "GBIF" "11171983" "10775177" 2 ""
"P_GMPHR" "Geamphorella" "accepted" "Protozoa" "Amoebozoa" "Lobosa" "Arcellinida" "Nebelidae" "Geamphorella" "" "" "genus" "Bonnet, 1959" "GBIF" "4888795" "2170" 2 "" "P_GMPHR" "Geamphorella" "accepted" "Protozoa" "Amoebozoa" "Lobosa" "Arcellinida" "Nebelidae" "Geamphorella" "" "" "genus" "Bonnet, 1959" "GBIF" "4888795" "2170" 2 ""
"P_GMPHR_LUCD" "Geamphorella lucida" "accepted" "Protozoa" "Amoebozoa" "Lobosa" "Arcellinida" "Nebelidae" "Geamphorella" "lucida" "" "species" "Bonnet, 1959" "GBIF" "10677162" "4888795" 2 "" "P_GMPHR_LUCD" "Geamphorella lucida" "accepted" "Protozoa" "Amoebozoa" "Lobosa" "Arcellinida" "Nebelidae" "Geamphorella" "lucida" "" "species" "Bonnet, 1959" "GBIF" "10677162" "4888795" 2 ""
"B_GEHNG" "Gehongia" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Christensenellaceae" "Gehongia" "" "" "genus" "Liu et al., 2022" "LPSN" "28816" "1935" 2 "" "B_GEHNG" "Gehongia" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Christensenellaceae" "Gehongia" "" "" "genus" "Liu et al., 2022" "LPSN" "28816" "1935" 2 ""
@ -22583,7 +22585,6 @@
"B_HYNSN_UDNS" "Hyunsoonleella udoensis" "synonym" "Bacteria" "Bacteroidota" "Flavobacteriia" "Flavobacteriales" "Flavobacteriaceae" "Hyunsoonleella" "udoensis" "" "species" "Kim et al., 2016" "LPSN" "793695" "517944" "793694" 2 "" "B_HYNSN_UDNS" "Hyunsoonleella udoensis" "synonym" "Bacteria" "Bacteroidota" "Flavobacteriia" "Flavobacteriales" "Flavobacteriaceae" "Hyunsoonleella" "udoensis" "" "species" "Kim et al., 2016" "LPSN" "793695" "517944" "793694" 2 ""
"B_HYNSN_UDNN" "Hyunsoonleella udonensis" "accepted" "Bacteria" "Bacteroidota" "Flavobacteriia" "Flavobacteriales" "Flavobacteriaceae" "Hyunsoonleella" "udonensis" "" "species" "Kim et al., 2016" "LPSN" "793694" "517944" "8797340" "7660455" 2 "" "B_HYNSN_UDNN" "Hyunsoonleella udonensis" "accepted" "Bacteria" "Bacteroidota" "Flavobacteriia" "Flavobacteriales" "Flavobacteriaceae" "Hyunsoonleella" "udonensis" "" "species" "Kim et al., 2016" "LPSN" "793694" "517944" "8797340" "7660455" 2 ""
"B_HYNSN_ULVA" "Hyunsoonleella ulvae" "accepted" "Bacteria" "Bacteroidota" "Flavobacteriia" "Flavobacteriales" "Flavobacteriaceae" "Hyunsoonleella" "ulvae" "" "species" "Wang et al., 2022" "LPSN" "28379" "517944" 2 "" "B_HYNSN_ULVA" "Hyunsoonleella ulvae" "accepted" "Bacteria" "Bacteroidota" "Flavobacteriia" "Flavobacteriales" "Flavobacteriaceae" "Hyunsoonleella" "ulvae" "" "species" "Wang et al., 2022" "LPSN" "28379" "517944" 2 ""
"B_ISDG" "ISDg" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Lachnospiraceae" "ISDg" "" "" "genus" "GBIF" "11121283" "4713" 2 ""
"A_[FAM]_IAINRCHC" "Iainarchaeaceae" "accepted" "Archaea" "Iainarchaeota" "Iainarchaeia" "Iainarchaeales" "Iainarchaeaceae" "" "" "" "family" "GBIF" "10843220" "10672343" 2 "" "A_[FAM]_IAINRCHC" "Iainarchaeaceae" "accepted" "Archaea" "Iainarchaeota" "Iainarchaeia" "Iainarchaeales" "Iainarchaeaceae" "" "" "" "family" "GBIF" "10843220" "10672343" 2 ""
"A_[ORD]_IANRCHLS" "Iainarchaeales" "accepted" "Archaea" "Iainarchaeota" "Iainarchaeia" "Iainarchaeales" "" "" "" "" "order" "GBIF" "10672343" "10847779" 2 "" "A_[ORD]_IANRCHLS" "Iainarchaeales" "accepted" "Archaea" "Iainarchaeota" "Iainarchaeia" "Iainarchaeales" "" "" "" "" "order" "GBIF" "10672343" "10847779" 2 ""
"A_[CLS]_IAINARCH" "Iainarchaeia" "accepted" "Archaea" "Iainarchaeota" "Iainarchaeia" "" "" "" "" "" "class" "GBIF" "10847779" "10776132" 2 "" "A_[CLS]_IAINARCH" "Iainarchaeia" "accepted" "Archaea" "Iainarchaeota" "Iainarchaeia" "" "" "" "" "" "class" "GBIF" "10847779" "10776132" 2 ""
@ -22793,6 +22794,7 @@
"B_ISCHN_ALKL" "Isachenkonia alkalipeptolytica" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Clostridiaceae" "Isachenkonia" "alkalipeptolytica" "" "species" "Zavarzina et al., 2020" "LPSN" "8748" "8742" 2 "" "B_ISCHN_ALKL" "Isachenkonia alkalipeptolytica" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Clostridiaceae" "Isachenkonia" "alkalipeptolytica" "" "species" "Zavarzina et al., 2020" "LPSN" "8748" "8742" 2 ""
"B_ISCTS" "Isactis" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Rivulariaceae" "Isactis" "" "" "genus" "Thuret et al., 1886" "GBIF" "3219609" "4306626" 2 "" "B_ISCTS" "Isactis" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Rivulariaceae" "Isactis" "" "" "genus" "Thuret et al., 1886" "GBIF" "3219609" "4306626" 2 ""
"B_ISCTS_PLAN" "Isactis plana" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Rivulariaceae" "Isactis" "plana" "" "species" "Thur et al." "GBIF" "3219610" "3219609" 2 "" "B_ISCTS_PLAN" "Isactis plana" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Rivulariaceae" "Isactis" "plana" "" "species" "Thur et al." "GBIF" "3219610" "3219609" 2 ""
"B_ISDG" "ISDg" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Lachnospiraceae" "ISDg" "" "" "genus" "GBIF" "11121283" "4713" 2 ""
"B_ISHKW" "Ishikawaella" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Ishikawaella" "" "" "genus" "GBIF" "10797324" "11158430" 2 "" "B_ISHKW" "Ishikawaella" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Ishikawaella" "" "" "genus" "GBIF" "10797324" "11158430" 2 ""
"B_ISHKW_CPSL" "Ishikawaella capsulata" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Ishikawaella" "capsulata" "" "species" "GBIF" "10718144" "10797324" 2 "" "B_ISHKW_CPSL" "Ishikawaella capsulata" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Ishikawaella" "capsulata" "" "species" "GBIF" "10718144" "10797324" 2 ""
"B_ISBCL" "Isobaculum" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Carnobacteriaceae" "Isobaculum" "" "" "genus" "Collins et al., 2002" "LPSN" "515857" "279" "3227154" 2 "432998006" "B_ISBCL" "Isobaculum" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Carnobacteriaceae" "Isobaculum" "" "" "genus" "Collins et al., 2002" "LPSN" "515857" "279" "3227154" 2 "432998006"
@ -23653,7 +23655,6 @@
"B_KYTCC_AERL" "Kytococcus aerolatus" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Kytococcaceae" "Kytococcus" "aerolatus" "" "species" "Nouioui et al., 2018" "LPSN" "788155" "515905" "7687887" "3225662" 1.5 "" "B_KYTCC_AERL" "Kytococcus aerolatus" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Kytococcaceae" "Kytococcus" "aerolatus" "" "species" "Nouioui et al., 2018" "LPSN" "788155" "515905" "7687887" "3225662" 1.5 ""
"B_KYTCC_SCHR" "Kytococcus schroeteri" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Kytococcaceae" "Kytococcus" "schroeteri" "" "species" "Becker et al., 2002" "LPSN" "777226" "515905" "3225663" "3225662" 1 "428721003" "B_KYTCC_SCHR" "Kytococcus schroeteri" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Kytococcaceae" "Kytococcus" "schroeteri" "" "species" "Becker et al., 2002" "LPSN" "777226" "515905" "3225663" "3225662" 1 "428721003"
"B_KYTCC_SDNT" "Kytococcus sedentarius" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Kytococcaceae" "Kytococcus" "sedentarius" "" "species" "Nouioui et al., 2018" "LPSN" "777227" "515905" "3225664" "3225662" 1 "113775009" "B_KYTCC_SDNT" "Kytococcus sedentarius" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Kytococcaceae" "Kytococcus" "sedentarius" "" "species" "Nouioui et al., 2018" "LPSN" "777227" "515905" "3225664" "3225662" 1 "113775009"
"B_LS-NO" "LS-NOB" "accepted" "Bacteria" "Nitrospinota" "Nitrospinia" "Nitrospinales" "Nitrospinaceae" "LS-NOB" "" "" "genus" "GBIF" "11159629" "5444" 2 ""
"B_LABED" "Labedaea" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Pseudonocardiales" "Pseudonocardiaceae" "Labedaea" "" "" "genus" "2012" "LPSN" "518231" "1137" "7668340" "3841" 2 "" "B_LABED" "Labedaea" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Pseudonocardiales" "Pseudonocardiaceae" "Labedaea" "" "" "genus" "2012" "LPSN" "518231" "1137" "7668340" "3841" 2 ""
"B_LABED_RHZS" "Labedaea rhizosphaerae" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Pseudonocardiales" "Pseudonocardiaceae" "Labedaea" "rhizosphaerae" "" "species" "2012" "LPSN" "790047" "518231" "7830525" "7668340" 2 "" "B_LABED_RHZS" "Labedaea rhizosphaerae" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Pseudonocardiales" "Pseudonocardiaceae" "Labedaea" "rhizosphaerae" "" "species" "2012" "LPSN" "790047" "518231" "7830525" "7668340" 2 ""
"B_LBDLL" "Labedella" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Microbacteriaceae" "Labedella" "" "" "genus" "Li et al., 2019" "LPSN" "517689" "875" "4899919" 2 "" "B_LBDLL" "Labedella" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Microbacteriaceae" "Labedella" "" "" "genus" "Li et al., 2019" "LPSN" "517689" "875" "4899919" 2 ""
@ -25498,6 +25499,7 @@
"B_LTTDB" "Lottiidibacillus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Caryophanales" "Bacillaceae" "Lottiidibacillus" "" "" "genus" "Liu et al., 2020" "LPSN" "9035" "191" 2 "" "B_LTTDB" "Lottiidibacillus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Caryophanales" "Bacillaceae" "Lottiidibacillus" "" "" "genus" "Liu et al., 2020" "LPSN" "9035" "191" 2 ""
"B_LTTDB_PTLL" "Lottiidibacillus patelloidae" "accepted" "Bacteria" "Bacillota" "Bacilli" "Caryophanales" "Bacillaceae" "Lottiidibacillus" "patelloidae" "" "species" "Liu et al., 2020" "LPSN" "15262" "9035" 2 "" "B_LTTDB_PTLL" "Lottiidibacillus patelloidae" "accepted" "Bacteria" "Bacillota" "Bacilli" "Caryophanales" "Bacillaceae" "Lottiidibacillus" "patelloidae" "" "species" "Liu et al., 2020" "LPSN" "15262" "9035" 2 ""
"P_[PHL]_LOUKOZOA" "Loukozoa" "accepted" "Protozoa" "Loukozoa" "" "" "" "" "" "" "phylum" "GBIF" "7872314" "7" 2 "" "P_[PHL]_LOUKOZOA" "Loukozoa" "accepted" "Protozoa" "Loukozoa" "" "" "" "" "" "" "phylum" "GBIF" "7872314" "7" 2 ""
"B_LS-NO" "LS-NOB" "accepted" "Bacteria" "Nitrospinota" "Nitrospinia" "Nitrospinales" "Nitrospinaceae" "LS-NOB" "" "" "genus" "GBIF" "11159629" "5444" 2 ""
"B_LUCBCTRM" "Lucibacterium" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Vibrionales" "Vibrionaceae" "Lucibacterium" "" "" "genus" "Hendrie et al., 1970" "LPSN" "515980" "1543" "517157" 1 "" "B_LUCBCTRM" "Lucibacterium" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Vibrionales" "Vibrionaceae" "Lucibacterium" "" "" "genus" "Hendrie et al., 1970" "LPSN" "515980" "1543" "517157" 1 ""
"B_LUCBCTRM_HRVY" "Lucibacterium harveyi" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Vibrionales" "Vibrionaceae" "Lucibacterium" "harveyi" "" "species" "Hendrie et al., 1970" "LPSN" "777606" "515980" "783009" 1 "" "B_LUCBCTRM_HRVY" "Lucibacterium harveyi" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Vibrionales" "Vibrionaceae" "Lucibacterium" "harveyi" "" "species" "Hendrie et al., 1970" "LPSN" "777606" "515980" "783009" 1 ""
"B_LUCFR" "Lucifera" "accepted" "Bacteria" "Bacillota" "Negativicutes" "Selenomonadales" "Sporomusaceae" "Lucifera" "" "" "genus" "Sanchez-Andrea et al., 2019" "LPSN" "521634" "2041" 2 "" "B_LUCFR" "Lucifera" "accepted" "Bacteria" "Bacillota" "Negativicutes" "Selenomonadales" "Sporomusaceae" "Lucifera" "" "" "genus" "Sanchez-Andrea et al., 2019" "LPSN" "521634" "2041" 2 ""
@ -25850,9 +25852,6 @@
"B_LYTCM" "Lyticum" "accepted" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rickettsiales" "Ehrlichiaceae" "Lyticum" "" "" "genus" "Preer et al., 1982" "LPSN" "517271" "473" "3221463" "4901684" 2 "433004006" "B_LYTCM" "Lyticum" "accepted" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rickettsiales" "Ehrlichiaceae" "Lyticum" "" "" "genus" "Preer et al., 1982" "LPSN" "517271" "473" "3221463" "4901684" 2 "433004006"
"B_LYTCM_FLGL" "Lyticum flagellatum" "accepted" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rickettsiales" "Ehrlichiaceae" "Lyticum" "flagellatum" "" "species" "Preer et al., 1982" "LPSN" "784168" "517271" "3221464" "3221463" 2 "433754005" "B_LYTCM_FLGL" "Lyticum flagellatum" "accepted" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rickettsiales" "Ehrlichiaceae" "Lyticum" "flagellatum" "" "species" "Preer et al., 1982" "LPSN" "784168" "517271" "3221464" "3221463" 2 "433754005"
"B_LYTCM_SNSM" "Lyticum sinuosum" "accepted" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rickettsiales" "Ehrlichiaceae" "Lyticum" "sinuosum" "" "species" "Preer et al., 1982" "LPSN" "784169" "517271" "3221465" "3221463" 2 "434353007" "B_LYTCM_SNSM" "Lyticum sinuosum" "accepted" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rickettsiales" "Ehrlichiaceae" "Lyticum" "sinuosum" "" "species" "Preer et al., 1982" "LPSN" "784169" "517271" "3221465" "3221463" 2 "434353007"
"A_MGII-" "MGIIa-I" "accepted" "Archaea" "Thermoplasmatota" "Poseidoniia" "Poseidoniales" "Poseidoniaceae" "MGIIa-I" "" "" "genus" "GBIF" "11196009" "10685831" 2 ""
"A_GII-P" "MGIIb-P" "accepted" "Archaea" "Thermoplasmatota" "Poseidoniia" "Poseidoniales" "Thalassarchaeaceae" "MGIIb-P" "" "" "genus" "GBIF" "11123790" "10752789" 2 ""
"B_MZ-XQ" "MZ-XQ" "accepted" "Bacteria" "Mycoplasmatota" "Mollicutes" "Acholeplasmatales" "Acholeplasmataceae" "MZ-XQ" "" "" "genus" "GBIF" "11137212" 2 ""
"B_MBKBC" "Mabikibacter" "synonym" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Hyphomicrobiales" "Notoacmeibacteraceae" "Mabikibacter" "" "" "genus" "Choi et al., 2017" "LPSN" "519257" "2084" "519233" 2 "" "B_MBKBC" "Mabikibacter" "synonym" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Hyphomicrobiales" "Notoacmeibacteraceae" "Mabikibacter" "" "" "genus" "Choi et al., 2017" "LPSN" "519257" "2084" "519233" 2 ""
"B_MBKBC_RUBR" "Mabikibacter ruber" "synonym" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Hyphomicrobiales" "Notoacmeibacteraceae" "Mabikibacter" "ruber" "" "species" "Choi et al., 2017" "LPSN" "795890" "519257" "795709" "9791970" 2 "" "B_MBKBC_RUBR" "Mabikibacter ruber" "synonym" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Hyphomicrobiales" "Notoacmeibacteraceae" "Mabikibacter" "ruber" "" "species" "Choi et al., 2017" "LPSN" "795890" "519257" "795709" "9791970" 2 ""
"B_MCLLB" "Macellibacteroides" "accepted" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Porphyromonadaceae" "Macellibacteroides" "" "" "genus" "Jabari et al., 2012" "LPSN" "518264" "1100" "8021701" 2 "" "B_MCLLB" "Macellibacteroides" "accepted" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Porphyromonadaceae" "Macellibacteroides" "" "" "genus" "Jabari et al., 2012" "LPSN" "518264" "1100" "8021701" 2 ""
@ -27859,6 +27858,8 @@
"F_MYRZY_PRPS_TXTL" "Meyerozyma parapsilosis tuxtlensis" "synonym" "Fungi" "Ascomycota" "Saccharomycetes" "Saccharomycetales" "Debaryomycetaceae" "Meyerozyma" "parapsilosis" "tuxtlensis" "subspecies" "Herrera et al." "GBIF" "3479713" "5893383" 1.5 "" "F_MYRZY_PRPS_TXTL" "Meyerozyma parapsilosis tuxtlensis" "synonym" "Fungi" "Ascomycota" "Saccharomycetes" "Saccharomycetales" "Debaryomycetaceae" "Meyerozyma" "parapsilosis" "tuxtlensis" "subspecies" "Herrera et al." "GBIF" "3479713" "5893383" 1.5 ""
"F_MYRZY_PSDG" "Meyerozyma pseudoguilliermondii" "synonym" "Fungi" "Ascomycota" "Saccharomycetes" "Saccharomycetales" "Debaryomycetaceae" "Meyerozyma" "pseudoguilliermondii" "" "species" "GBIF" "3556778" "5893380" "5893383" 1.5 "" "F_MYRZY_PSDG" "Meyerozyma pseudoguilliermondii" "synonym" "Fungi" "Ascomycota" "Saccharomycetes" "Saccharomycetales" "Debaryomycetaceae" "Meyerozyma" "pseudoguilliermondii" "" "species" "GBIF" "3556778" "5893380" "5893383" 1.5 ""
"F_MYRZY_SMTH" "Meyerozyma smithsonii" "accepted" "Fungi" "Ascomycota" "Saccharomycetes" "Saccharomycetales" "Debaryomycetaceae" "Meyerozyma" "smithsonii" "" "species" "Yurkov et al." "GBIF" "10712206" "5893380" 1.5 "" "F_MYRZY_SMTH" "Meyerozyma smithsonii" "accepted" "Fungi" "Ascomycota" "Saccharomycetes" "Saccharomycetales" "Debaryomycetaceae" "Meyerozyma" "smithsonii" "" "species" "Yurkov et al." "GBIF" "10712206" "5893380" 1.5 ""
"A_MGII-" "MGIIa-I" "accepted" "Archaea" "Thermoplasmatota" "Poseidoniia" "Poseidoniales" "Poseidoniaceae" "MGIIa-I" "" "" "genus" "GBIF" "11196009" "10685831" 2 ""
"A_GII-P" "MGIIb-P" "accepted" "Archaea" "Thermoplasmatota" "Poseidoniia" "Poseidoniales" "Thalassarchaeaceae" "MGIIb-P" "" "" "genus" "GBIF" "11123790" "10752789" 2 ""
"B_MCVBR" "Micavibrio" "accepted" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "Bdellovibrionaceae" "Micavibrio" "" "" "genus" "Lambina et al., 1989" "LPSN" "517285" "203" "11199699" "8932" 2 "429897008" "B_MCVBR" "Micavibrio" "accepted" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "Bdellovibrionaceae" "Micavibrio" "" "" "genus" "Lambina et al., 1989" "LPSN" "517285" "203" "11199699" "8932" 2 "429897008"
"B_MCVBR_ADMR" "Micavibrio admirandus" "accepted" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "Bdellovibrionaceae" "Micavibrio" "admirandus" "" "species" "Lambina et al., 1989" "LPSN" "784260" "517285" 2 "433368001" "B_MCVBR_ADMR" "Micavibrio admirandus" "accepted" "Bacteria" "Pseudomonadota" "Oligoflexia" "Bdellovibrionales" "Bdellovibrionaceae" "Micavibrio" "admirandus" "" "species" "Lambina et al., 1989" "LPSN" "784260" "517285" 2 "433368001"
"A_[FAM]_MICRRCHC" "Micrarchaeaceae" "accepted" "Archaea" "Micrarchaeota" "Micrarchaeia" "Micrarchaeales" "Micrarchaeaceae" "" "" "" "family" "GBIF" "10878041" "10702512" 2 "" "A_[FAM]_MICRRCHC" "Micrarchaeaceae" "accepted" "Archaea" "Micrarchaeota" "Micrarchaeia" "Micrarchaeales" "Micrarchaeaceae" "" "" "" "family" "GBIF" "10878041" "10702512" 2 ""
@ -30317,6 +30318,7 @@
"B_MYXSR_BRMN" "Myxosarcina burmensis" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Xenococcaceae" "Myxosarcina" "burmensis" "" "species" "Skuja" "GBIF" "3216275" "7729673" 2 "" "B_MYXSR_BRMN" "Myxosarcina burmensis" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Xenococcaceae" "Myxosarcina" "burmensis" "" "species" "Skuja" "GBIF" "3216275" "7729673" 2 ""
"B_MYXSR_CNCN" "Myxosarcina concinna" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Xenococcaceae" "Myxosarcina" "concinna" "" "species" "GBIF" "3217367" "7729673" 2 "" "B_MYXSR_CNCN" "Myxosarcina concinna" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Xenococcaceae" "Myxosarcina" "concinna" "" "species" "GBIF" "3217367" "7729673" 2 ""
"B_MYXSR_GLCP" "Myxosarcina gloeocapsoides" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Xenococcaceae" "Myxosarcina" "gloeocapsoides" "" "species" "Komarek et al." "GBIF" "3217365" "7729673" 2 "" "B_MYXSR_GLCP" "Myxosarcina gloeocapsoides" "accepted" "Bacteria" "Cyanobacteria" "Cyanobacteriia" "Cyanobacteriales" "Xenococcaceae" "Myxosarcina" "gloeocapsoides" "" "species" "Komarek et al." "GBIF" "3217365" "7729673" 2 ""
"B_MZ-XQ" "MZ-XQ" "accepted" "Bacteria" "Mycoplasmatota" "Mollicutes" "Acholeplasmatales" "Acholeplasmataceae" "MZ-XQ" "" "" "genus" "GBIF" "11137212" 2 ""
"B_MZBMY" "Mzabimyces" "synonym" "Bacteria" "Actinomycetota" "Actinomycetes" "Pseudonocardiales" "Pseudonocardiaceae" "Mzabimyces" "" "" "genus" "Saker et al., 2015" "LPSN" "518817" "1137" "518590" 2 "" "B_MZBMY" "Mzabimyces" "synonym" "Bacteria" "Actinomycetota" "Actinomycetes" "Pseudonocardiales" "Pseudonocardiaceae" "Mzabimyces" "" "" "genus" "Saker et al., 2015" "LPSN" "518817" "1137" "518590" 2 ""
"B_MZBMY_ALGR" "Mzabimyces algeriensis" "synonym" "Bacteria" "Actinomycetota" "Actinomycetes" "Pseudonocardiales" "Pseudonocardiaceae" "Mzabimyces" "algeriensis" "" "species" "Saker et al., 2015" "LPSN" "793403" "518817" "795677" 2 "" "B_MZBMY_ALGR" "Mzabimyces algeriensis" "synonym" "Bacteria" "Actinomycetota" "Actinomycetes" "Pseudonocardiales" "Pseudonocardiaceae" "Mzabimyces" "algeriensis" "" "species" "Saker et al., 2015" "LPSN" "793403" "518817" "795677" 2 ""
"B_NAASI" "Naasia" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Microbacteriaceae" "Naasia" "" "" "genus" "Weon et al., 2013" "LPSN" "518394" "875" "8305219" 2 "" "B_NAASI" "Naasia" "accepted" "Bacteria" "Actinomycetota" "Actinomycetes" "Micrococcales" "Microbacteriaceae" "Naasia" "" "" "genus" "Weon et al., 2013" "LPSN" "518394" "875" "8305219" 2 ""
@ -41270,6 +41272,7 @@
"B_SLMNL_ARPH" "Salmonella Arapahoe" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Arapahoe" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ARPH" "Salmonella Arapahoe" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Arapahoe" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ARCH" "Salmonella Arechavaleta" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Arechavaleta" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ARCH" "Salmonella Arechavaleta" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Arechavaleta" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ARGN" "Salmonella Argenteuil" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Argenteuil" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ARGN" "Salmonella Argenteuil" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Argenteuil" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ARZN" "Salmonella arizonae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "arizonae" "" "species" "Kauffmann, 1964" "LPSN" "780744" "516547" "780755" "5427588" "3221815" 1.5 ""
"B_SLMNL_ARSH" "Salmonella Arusha" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Arusha" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ARSH" "Salmonella Arusha" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Arusha" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ASCH" "Salmonella Aschersleben" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Aschersleben" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ASCH" "Salmonella Aschersleben" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Aschersleben" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ASHN" "Salmonella Ashanti" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Ashanti" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ASHN" "Salmonella Ashanti" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Ashanti" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -41378,6 +41381,7 @@
"B_SLMNL_BLTN" "Salmonella Bolton" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bolton" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_BLTN" "Salmonella Bolton" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bolton" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_BNMS" "Salmonella Bonames" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bonames" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_BNMS" "Salmonella Bonames" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bonames" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_BNRN" "Salmonella Bonariensis" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bonariensis" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_BNRN" "Salmonella Bonariensis" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bonariensis" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_BNGR" "Salmonella bongori" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "bongori" "" "species" "Reeves et al., 1989" "LPSN" "780745" "516547" "5427596" "3221815" 1 "398393000"
"B_SLMNL_BONN" "Salmonella Bonn" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bonn" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_BONN" "Salmonella Bonn" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bonn" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_BOTL" "Salmonella Bootle" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bootle" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_BOTL" "Salmonella Bootle" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Bootle" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_BRBC" "Salmonella Borbeck" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Borbeck" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_BRBC" "Salmonella Borbeck" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Borbeck" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -41480,6 +41484,14 @@
"B_SLMNL_CHNG" "Salmonella Chingola" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Chingola" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_CHNG" "Salmonella Chingola" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Chingola" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_CHRD" "Salmonella Chiredzi" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Chiredzi" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_CHRD" "Salmonella Chiredzi" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Chiredzi" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_CHTT" "Salmonella Chittagong" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Chittagong" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_CHTT" "Salmonella Chittagong" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Chittagong" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_CHLR" "Salmonella choleraesuis" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "" "species" "Weldin, 1927" "LPSN" "780746" "516547" "784857" "7515106" "3221815" "9701185" 1 ""
"B_SLMNL_CHLR_ARZN" "Salmonella choleraesuis arizonae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "arizonae" "subspecies" "Le Minor et al., 1985" "LPSN" "780747" "780746" "780755" "5427587" "7515106" "5427586" 1 ""
"B_SLMNL_CHLR_BNGR" "Salmonella choleraesuis bongori" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "bongori" "subspecies" "Le Minor et al., 1985" "LPSN" "780748" "780746" "780745" "5427597" "7515106" "5427596" 1 ""
"B_SLMNL_CHLR_CHLR" "Salmonella choleraesuis choleraesuis" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "choleraesuis" "subspecies" "Le Minor et al., 1985" "LPSN" "780749" "780746" "780758" "5427590" "7515106" "5427589" 1 ""
"B_SLMNL_CHLR_DRZN" "Salmonella choleraesuis diarizonae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "diarizonae" "subspecies" "Le Minor et al., 1985" "LPSN" "780750" "780746" "780757" "5427579" "7515106" "5427578" 1 ""
"B_SLMNL_CHLR_HOTN" "Salmonella choleraesuis houtenae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "houtenae" "subspecies" "Le Minor et al., 1985" "LPSN" "780751" "780746" "780759" "5427581" "7515106" "5427580" 1 ""
"B_SLMNL_CHLR_INDC" "Salmonella choleraesuis indica" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "indica" "subspecies" "Le Minor et al., 1987" "LPSN" "780752" "780746" "780760" "5427583" "7515106" "5427582" 1 ""
"B_SLMNL_CHLR_SALM" "Salmonella choleraesuis salamae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "salamae" "subspecies" "Le Minor et al., 1985" "LPSN" "780753" "780746" "780761" "5427585" "7515106" "5427584" 1 ""
"B_SLMNL_CHMD" "Salmonella Chomedey" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Chomedey" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_CHMD" "Salmonella Chomedey" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Chomedey" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_CHRS" "Salmonella Christiansborg" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Christiansborg" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_CHRS" "Salmonella Christiansborg" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Christiansborg" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_CLCK" "Salmonella Clackamas" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Clackamas" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_CLCK" "Salmonella Clackamas" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Clackamas" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -41542,6 +41554,7 @@
"B_SLMNL_DESS" "Salmonella Dessau" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Dessau" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_DESS" "Salmonella Dessau" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Dessau" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_DTML" "Salmonella Detmold" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Detmold" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_DTML" "Salmonella Detmold" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Detmold" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_DVRS" "Salmonella Deversoir" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Deversoir" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_DVRS" "Salmonella Deversoir" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Deversoir" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_DRZN" "Salmonella diarizonae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "diarizonae" "" "species" "GBIF" "516547" "10672082" "3221815" 1.5 ""
"B_SLMNL_DIBR" "Salmonella Dibra" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Dibra" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_DIBR" "Salmonella Dibra" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Dibra" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_DTRC" "Salmonella Dietrichsdorf" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Dietrichsdorf" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_DTRC" "Salmonella Dietrichsdorf" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Dietrichsdorf" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_DPPL" "Salmonella Dieuppeul" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Dieuppeul" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_DPPL" "Salmonella Dieuppeul" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Dieuppeul" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -41603,6 +41616,15 @@
"B_SLMNL_ENCN" "Salmonella Encino" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Encino" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ENCN" "Salmonella Encino" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Encino" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ENSC" "Salmonella Enschede" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Enschede" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ENSC" "Salmonella Enschede" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Enschede" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ENTB" "Salmonella Entebbe" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Entebbe" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ENTB" "Salmonella Entebbe" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Entebbe" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ENTR" "Salmonella enterica" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "" "species" "Le Minor et al., 1987" "LPSN" "784857" "516547" "9701185" "3221815" 1 "110378009,397502001,398428002,398508004,398371005,398620001,398488004"
"B_SLMNL_ENTR_ARZN" "Salmonella enterica arizonae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "arizonae" "subspecies" "Le Minor et al., 1987" "LPSN" "780755" "784857" "5427586" "9701185" 1 ""
"B_SLMNL_ENTR_BNGR" "Salmonella enterica bongori" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "bongori" "subspecies" "Le Minor et al., 1987" "LPSN" "780756" "784857" "780745" "5427598" "9701185" "5427596" 1 ""
"B_SLMNL_ENTR_DRZN" "Salmonella enterica diarizonae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "diarizonae" "subspecies" "Le Minor et al., 1987" "LPSN" "780757" "784857" "5427578" "9701185" 1 ""
"B_SLMNL_ENTR_ENTR" "Salmonella enterica enterica" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "enterica" "subspecies" "Le Minor et al., 1987" "LPSN" "780758" "784857" "5427589" "9701185" 1 ""
"B_SLMNL_ENTR_HOTN" "Salmonella enterica houtenae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "houtenae" "subspecies" "Le Minor et al., 1987" "LPSN" "780759" "784857" "5427580" "9701185" 1 ""
"B_SLMNL_ENTR_INDC" "Salmonella enterica indica" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "indica" "subspecies" "Le Minor et al., 1987" "LPSN" "780760" "784857" "5427582" "9701185" 1 ""
"B_SLMNL_ENTR_SALM" "Salmonella enterica salamae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "salamae" "subspecies" "Le Minor et al., 1987" "LPSN" "780761" "784857" "5427584" "9701185" 1 ""
"B_SLMNL_RTDS" "Salmonella enteritidis" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enteritidis" "" "species" "Castellani et al., 1919" "LPSN" "780762" "516547" "784857" "5427592" "3221815" "9701185" 1 ""
"B_SLMNL_ENUG" "Salmonella Enugu" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Enugu" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ENUG" "Salmonella Enugu" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Enugu" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_EPLN" "Salmonella Epalinges" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Epalinges" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_EPLN" "Salmonella Epalinges" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Epalinges" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_EPCR" "Salmonella Epicrates" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Epicrates" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_EPCR" "Salmonella Epicrates" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Epicrates" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -41725,6 +41747,10 @@
"B_SLMNL_GRPB" "Salmonella Group B" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group B" "" "species" "manually added" "516547" "3221815" 1.5 "" "B_SLMNL_GRPB" "Salmonella Group B" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group B" "" "species" "manually added" "516547" "3221815" 1.5 ""
"B_SLMNL_GRPC" "Salmonella Group C" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group C" "" "species" "manually added" "516547" "3221815" 1.5 "" "B_SLMNL_GRPC" "Salmonella Group C" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group C" "" "species" "manually added" "516547" "3221815" 1.5 ""
"B_SLMNL_GRPD" "Salmonella Group D" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group D" "" "species" "manually added" "516547" "3221815" 1.5 "" "B_SLMNL_GRPD" "Salmonella Group D" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group D" "" "species" "manually added" "516547" "3221815" 1.5 ""
"B_SLMNL_GRPE" "Salmonella Group E" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group E" "" "species" "manually added" "516547" "3221815" 1.5 ""
"B_SLMNL_GRPF" "Salmonella Group F" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group F" "" "species" "manually added" "516547" "3221815" 1.5 ""
"B_SLMNL_GRPG" "Salmonella Group G" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group G" "" "species" "manually added" "516547" "3221815" 1.5 ""
"B_SLMNL_GRPH" "Salmonella Group H" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "Group H" "" "species" "manually added" "516547" "3221815" 1.5 ""
"B_SLMNL_GNSS" "Salmonella Grumpensis" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Grumpensis" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_GNSS" "Salmonella Grumpensis" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Grumpensis" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_GRPR" "Salmonella Guarapiranga" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Guarapiranga" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_GRPR" "Salmonella Guarapiranga" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Guarapiranga" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_GURN" "Salmonella Guerin" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Guerin" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_GURN" "Salmonella Guerin" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Guerin" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -41788,6 +41814,7 @@
"B_SLMNL_HNGK" "Salmonella Hongkong" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Hongkong" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_HNGK" "Salmonella Hongkong" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Hongkong" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_HRSH" "Salmonella Horsham" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Horsham" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_HRSH" "Salmonella Horsham" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Horsham" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_HSTN" "Salmonella Houston" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Houston" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_HSTN" "Salmonella Houston" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Houston" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_HOTN" "Salmonella houtenae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "houtenae" "" "species" "GBIF" "516547" "7617321" "3221815" 1.5 ""
"B_SLMNL_HDDN" "Salmonella Huddinge" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Huddinge" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_HDDN" "Salmonella Huddinge" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Huddinge" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_HTTW" "Salmonella Huettwilen" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Huettwilen" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_HTTW" "Salmonella Huettwilen" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Huettwilen" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_HULL" "Salmonella Hull" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Hull" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_HULL" "Salmonella Hull" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Hull" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -42257,6 +42284,7 @@
"B_SLMNL_PKST" "Salmonella Pakistan" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Pakistan" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_PKST" "Salmonella Pakistan" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Pakistan" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_PLMN" "Salmonella Palamaner" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Palamaner" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_PLMN" "Salmonella Palamaner" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Palamaner" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_PALM" "Salmonella Palime" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Palime" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_PALM" "Salmonella Palime" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Palime" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_PANM" "Salmonella panama" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "panama" "" "species" "Kauffmann, 1934" "GBIF" "516547" "9407232" "3221815" 1.5 ""
"B_SLMNL_PAPN" "Salmonella Papuana" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Papuana" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_PAPN" "Salmonella Papuana" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Papuana" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_PARK" "Salmonella Parakou" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Parakou" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_PARK" "Salmonella Parakou" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Parakou" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_PRTY" "Salmonella Paratyphi" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Paratyphi" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_PRTY" "Salmonella Paratyphi" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Paratyphi" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -42459,6 +42487,7 @@
"B_SLMNL_STVN" "Salmonella Stuivenberg" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Stuivenberg" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_STVN" "Salmonella Stuivenberg" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Stuivenberg" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_STTT" "Salmonella Stuttgart" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Stuttgart" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_STTT" "Salmonella Stuttgart" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Stuttgart" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_SUBR" "Salmonella Suberu" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Suberu" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_SUBR" "Salmonella Suberu" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Suberu" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_SBTR" "Salmonella subterranea" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "subterranea" "" "species" "Shelobolina et al., 2005" "LPSN" "780769" "516547" "5427595" "3221815" 1.5 ""
"B_SLMNL_SUDN" "Salmonella Sudan" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Sudan" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_SUDN" "Salmonella Sudan" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Sudan" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_SLLD" "Salmonella Suelldorf" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Suelldorf" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_SLLD" "Salmonella Suelldorf" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Suelldorf" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_SNDS" "Salmonella Sundsvall" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Sundsvall" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_SNDS" "Salmonella Sundsvall" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Sundsvall" "subspecies" "manually added" "784857" "9701185" 1 ""
@ -42696,29 +42725,6 @@
"B_SLMNL_ZONG" "Salmonella Zongo" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Zongo" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ZONG" "Salmonella Zongo" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Zongo" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ZULN" "Salmonella Zuilen" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Zuilen" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ZULN" "Salmonella Zuilen" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Zuilen" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ZWCK" "Salmonella Zwickau" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Zwickau" "subspecies" "manually added" "784857" "9701185" 1 "" "B_SLMNL_ZWCK" "Salmonella Zwickau" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "Zwickau" "subspecies" "manually added" "784857" "9701185" 1 ""
"B_SLMNL_ARZN" "Salmonella arizonae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "arizonae" "" "species" "Kauffmann, 1964" "LPSN" "780744" "516547" "780755" "5427588" "3221815" 1.5 ""
"B_SLMNL_BNGR" "Salmonella bongori" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "bongori" "" "species" "Reeves et al., 1989" "LPSN" "780745" "516547" "5427596" "3221815" 1 "398393000"
"B_SLMNL_CHLR" "Salmonella choleraesuis" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "" "species" "Weldin, 1927" "LPSN" "780746" "516547" "784857" "7515106" "3221815" "9701185" 1 ""
"B_SLMNL_CHLR_ARZN" "Salmonella choleraesuis arizonae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "arizonae" "subspecies" "Le Minor et al., 1985" "LPSN" "780747" "780746" "780755" "5427587" "7515106" "5427586" 1 ""
"B_SLMNL_CHLR_BNGR" "Salmonella choleraesuis bongori" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "bongori" "subspecies" "Le Minor et al., 1985" "LPSN" "780748" "780746" "780745" "5427597" "7515106" "5427596" 1 ""
"B_SLMNL_CHLR_CHLR" "Salmonella choleraesuis choleraesuis" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "choleraesuis" "subspecies" "Le Minor et al., 1985" "LPSN" "780749" "780746" "780758" "5427590" "7515106" "5427589" 1 ""
"B_SLMNL_CHLR_DRZN" "Salmonella choleraesuis diarizonae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "diarizonae" "subspecies" "Le Minor et al., 1985" "LPSN" "780750" "780746" "780757" "5427579" "7515106" "5427578" 1 ""
"B_SLMNL_CHLR_HOTN" "Salmonella choleraesuis houtenae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "houtenae" "subspecies" "Le Minor et al., 1985" "LPSN" "780751" "780746" "780759" "5427581" "7515106" "5427580" 1 ""
"B_SLMNL_CHLR_INDC" "Salmonella choleraesuis indica" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "indica" "subspecies" "Le Minor et al., 1987" "LPSN" "780752" "780746" "780760" "5427583" "7515106" "5427582" 1 ""
"B_SLMNL_CHLR_SALM" "Salmonella choleraesuis salamae" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "choleraesuis" "salamae" "subspecies" "Le Minor et al., 1985" "LPSN" "780753" "780746" "780761" "5427585" "7515106" "5427584" 1 ""
"B_SLMNL_DRZN" "Salmonella diarizonae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "diarizonae" "" "species" "GBIF" "516547" "10672082" "3221815" 1.5 ""
"B_SLMNL_ENTR" "Salmonella enterica" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "" "species" "Le Minor et al., 1987" "LPSN" "784857" "516547" "9701185" "3221815" 1 "110378009,397502001,398428002,398508004,398371005,398620001,398488004"
"B_SLMNL_ENTR_ARZN" "Salmonella enterica arizonae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "arizonae" "subspecies" "Le Minor et al., 1987" "LPSN" "780755" "784857" "5427586" "9701185" 1 ""
"B_SLMNL_ENTR_BNGR" "Salmonella enterica bongori" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "bongori" "subspecies" "Le Minor et al., 1987" "LPSN" "780756" "784857" "780745" "5427598" "9701185" "5427596" 1 ""
"B_SLMNL_ENTR_DRZN" "Salmonella enterica diarizonae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "diarizonae" "subspecies" "Le Minor et al., 1987" "LPSN" "780757" "784857" "5427578" "9701185" 1 ""
"B_SLMNL_ENTR_ENTR" "Salmonella enterica enterica" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "enterica" "subspecies" "Le Minor et al., 1987" "LPSN" "780758" "784857" "5427589" "9701185" 1 ""
"B_SLMNL_ENTR_HOTN" "Salmonella enterica houtenae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "houtenae" "subspecies" "Le Minor et al., 1987" "LPSN" "780759" "784857" "5427580" "9701185" 1 ""
"B_SLMNL_ENTR_INDC" "Salmonella enterica indica" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "indica" "subspecies" "Le Minor et al., 1987" "LPSN" "780760" "784857" "5427582" "9701185" 1 ""
"B_SLMNL_ENTR_SALM" "Salmonella enterica salamae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enterica" "salamae" "subspecies" "Le Minor et al., 1987" "LPSN" "780761" "784857" "5427584" "9701185" 1 ""
"B_SLMNL_RTDS" "Salmonella enteritidis" "synonym" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "enteritidis" "" "species" "Castellani et al., 1919" "LPSN" "780762" "516547" "784857" "5427592" "3221815" "9701185" 1 ""
"B_SLMNL_HOTN" "Salmonella houtenae" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "houtenae" "" "species" "GBIF" "516547" "7617321" "3221815" 1.5 ""
"B_SLMNL_PANM" "Salmonella panama" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "panama" "" "species" "Kauffmann, 1934" "GBIF" "516547" "9407232" "3221815" 1.5 ""
"B_SLMNL_SBTR" "Salmonella subterranea" "accepted" "Bacteria" "Pseudomonadota" "Gammaproteobacteria" "Enterobacterales" "Enterobacteriaceae" "Salmonella" "subterranea" "" "species" "Shelobolina et al., 2005" "LPSN" "780769" "516547" "5427595" "3221815" 1.5 ""
"B_SLSPL" "Salsipaludibacter" "accepted" "Bacteria" "Actinomycetota" "Nitriliruptoria" "Salsipaludibacterales" "Salsipaludibacteraceae" "Salsipaludibacter" "" "" "genus" "Almeida et al., 2022" "LPSN" "25963" "25953" 2 "" "B_SLSPL" "Salsipaludibacter" "accepted" "Bacteria" "Actinomycetota" "Nitriliruptoria" "Salsipaludibacterales" "Salsipaludibacteraceae" "Salsipaludibacter" "" "" "genus" "Almeida et al., 2022" "LPSN" "25963" "25953" 2 ""
"B_SLSPL_ALBS" "Salsipaludibacter albus" "accepted" "Bacteria" "Actinomycetota" "Nitriliruptoria" "Salsipaludibacterales" "Salsipaludibacteraceae" "Salsipaludibacter" "albus" "" "species" "Almeida et al., 2022" "LPSN" "25977" "25963" 2 "" "B_SLSPL_ALBS" "Salsipaludibacter albus" "accepted" "Bacteria" "Actinomycetota" "Nitriliruptoria" "Salsipaludibacterales" "Salsipaludibacteraceae" "Salsipaludibacter" "albus" "" "species" "Almeida et al., 2022" "LPSN" "25977" "25963" 2 ""
"B_[FAM]_SLSPLDBC" "Salsipaludibacteraceae" "accepted" "Bacteria" "Actinomycetota" "Nitriliruptoria" "Salsipaludibacterales" "Salsipaludibacteraceae" "" "" "" "family" "Almeida et al., 2022" "LPSN" "25953" "25966" 2 "" "B_[FAM]_SLSPLDBC" "Salsipaludibacteraceae" "accepted" "Bacteria" "Actinomycetota" "Nitriliruptoria" "Salsipaludibacterales" "Salsipaludibacteraceae" "" "" "" "family" "Almeida et al., 2022" "LPSN" "25953" "25966" 2 ""
@ -45428,15 +45434,6 @@
"B_STRPTB_RATT" "Streptobacillus ratti" "accepted" "Bacteria" "Fusobacteriota" "Fusobacteriia" "Fusobacteriales" "Leptotrichiaceae" "Streptobacillus" "ratti" "" "species" "Eisenberg et al., 2016" "LPSN" "794063" "516688" "9144099" "3225903" 1.5 "" "B_STRPTB_RATT" "Streptobacillus ratti" "accepted" "Bacteria" "Fusobacteriota" "Fusobacteriia" "Fusobacteriales" "Leptotrichiaceae" "Streptobacillus" "ratti" "" "species" "Eisenberg et al., 2016" "LPSN" "794063" "516688" "9144099" "3225903" 1.5 ""
"B_[FAM]_STRPTCCC" "Streptococcaceae" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "" "" "" "family" "Deibel et al., 1974" "LPSN" "1344" "5123" "4899829" "577" "7798" 2 "115107007" "B_[FAM]_STRPTCCC" "Streptococcaceae" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "" "" "" "family" "Deibel et al., 1974" "LPSN" "1344" "5123" "4899829" "577" "7798" 2 "115107007"
"B_STRPT" "Streptococcus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "" "" "genus" "Rosenbach, 1884" "LPSN" "517118" "1344" "3223465" "4899829" 1 "58800005,414871004,70160008" "B_STRPT" "Streptococcus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "" "" "genus" "Rosenbach, 1884" "LPSN" "517118" "1344" "3223465" "4899829" 1 "58800005,414871004,70160008"
"B_STRPT_GRPA" "Streptococcus Group A" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group A" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPB" "Streptococcus Group B" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group B" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPC" "Streptococcus Group C" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group C" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPD" "Streptococcus Group D" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group D" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPF" "Streptococcus Group F" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group F" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPG" "Streptococcus Group G" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group G" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPH" "Streptococcus Group H" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group H" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPK" "Streptococcus Group K" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group K" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPL" "Streptococcus Group L" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group L" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_ACDM" "Streptococcus acidominimus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "acidominimus" "" "species" "Ayers et al., 1922" "LPSN" "781295" "517118" 1 "51182006" "B_STRPT_ACDM" "Streptococcus acidominimus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "acidominimus" "" "species" "Ayers et al., 1922" "LPSN" "781295" "517118" 1 "51182006"
"B_STRPT_ADJC" "Streptococcus adjacens" "synonym" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "adjacens" "" "species" "Bouvet et al., 1989" "LPSN" "781296" "517118" "776611" 1.5 "" "B_STRPT_ADJC" "Streptococcus adjacens" "synonym" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "adjacens" "" "species" "Bouvet et al., 1989" "LPSN" "781296" "517118" "776611" 1.5 ""
"B_STRPT_AGLC" "Streptococcus agalactiae" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "agalactiae" "" "species" "Lehmann et al., 1896" "LPSN" "781297" "517118" 1 "713924007,43492007" "B_STRPT_AGLC" "Streptococcus agalactiae" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "agalactiae" "" "species" "Lehmann et al., 1896" "LPSN" "781297" "517118" 1 "713924007,43492007"
@ -45506,6 +45503,18 @@
"B_STRPT_GLLL_PSTR" "Streptococcus gallolyticus pasteurianus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "gallolyticus" "pasteurianus" "subspecies" "Beck et al., 2008" "LPSN" "781340" "781337" "3227070" 1.25 "" "B_STRPT_GLLL_PSTR" "Streptococcus gallolyticus pasteurianus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "gallolyticus" "pasteurianus" "subspecies" "Beck et al., 2008" "LPSN" "781340" "781337" "3227070" 1.25 ""
"B_STRPT_GARV" "Streptococcus garvieae" "synonym" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "garvieae" "" "species" "Collins et al., 1984" "LPSN" "781341" "517118" "777418" 1 "" "B_STRPT_GARV" "Streptococcus garvieae" "synonym" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "garvieae" "" "species" "Collins et al., 1984" "LPSN" "781341" "517118" "777418" 1 ""
"B_STRPT_GRDN" "Streptococcus gordonii" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "gordonii" "" "species" "Kilian et al., 1989" "LPSN" "781342" "517118" 1 "113986004" "B_STRPT_GRDN" "Streptococcus gordonii" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "gordonii" "" "species" "Kilian et al., 1989" "LPSN" "781342" "517118" 1 "113986004"
"B_STRPT_GRPA" "Streptococcus Group A" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group A" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPB" "Streptococcus Group B" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group B" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPC" "Streptococcus Group C" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group C" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPD" "Streptococcus Group D" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group D" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPE" "Streptococcus Group E" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group E" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPF" "Streptococcus Group F" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group F" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPG" "Streptococcus Group G" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group G" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPH" "Streptococcus Group H" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group H" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPI" "Streptococcus Group I" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group I" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPJ" "Streptococcus Group J" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group J" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPK" "Streptococcus Group K" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group K" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GRPL" "Streptococcus Group L" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "Group L" "" "species" "Lancefield, 1933" "manually added" 1.5 ""
"B_STRPT_GWNG" "Streptococcus gwangjuense" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "gwangjuense" "" "species" "GBIF" "11190550" "3223465" 1.5 "" "B_STRPT_GWNG" "Streptococcus gwangjuense" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "gwangjuense" "" "species" "GBIF" "11190550" "3223465" 1.5 ""
"B_STRPT_HLCH" "Streptococcus halichoeri" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "halichoeri" "" "species" "Shewmaker et al., 2016" "LPSN" "781344" "517118" 1.25 "438161002" "B_STRPT_HLCH" "Streptococcus halichoeri" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "halichoeri" "" "species" "Shewmaker et al., 2016" "LPSN" "781344" "517118" 1.25 "438161002"
"B_STRPT_HLTS" "Streptococcus halitosis" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "halitosis" "" "species" "GBIF" "10822581" "3223465" 1.5 "" "B_STRPT_HLTS" "Streptococcus halitosis" "accepted" "Bacteria" "Bacillota" "Bacilli" "Lactobacillales" "Streptococcaceae" "Streptococcus" "halitosis" "" "species" "GBIF" "10822581" "3223465" 1.5 ""
@ -51722,7 +51731,6 @@
"A_WKNGR_YPNS" "Wukongarchaeum yapensis" "accepted" "Archaea" "Asgardarchaeota" "Wukongarchaeia" "Wukongarchaeales" "Wukongarchaeaceae" "Wukongarchaeum" "yapensis" "" "species" "GBIF" "11649514" "11817462" 2 "" "A_WKNGR_YPNS" "Wukongarchaeum yapensis" "accepted" "Archaea" "Asgardarchaeota" "Wukongarchaeia" "Wukongarchaeales" "Wukongarchaeaceae" "Wukongarchaeum" "yapensis" "" "species" "GBIF" "11649514" "11817462" 2 ""
"B_WKNGB" "Wukongibacter" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Peptostreptococcaceae" "Wukongibacter" "" "" "genus" "Li et al., 2016" "LPSN" "519079" "1053" "9506110" "7800" 2 "" "B_WKNGB" "Wukongibacter" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Peptostreptococcaceae" "Wukongibacter" "" "" "genus" "Li et al., 2016" "LPSN" "519079" "1053" "9506110" "7800" 2 ""
"B_WKNGB_BDNS" "Wukongibacter baidiensis" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Peptostreptococcaceae" "Wukongibacter" "baidiensis" "" "species" "Li et al., 2016" "LPSN" "794822" "519079" "9479445" "9506110" 2 "" "B_WKNGB_BDNS" "Wukongibacter baidiensis" "accepted" "Bacteria" "Bacillota" "Clostridia" "Eubacteriales" "Peptostreptococcaceae" "Wukongibacter" "baidiensis" "" "species" "Li et al., 2016" "LPSN" "794822" "519079" "9479445" "9506110" 2 ""
"B_XYC" "XYC" "accepted" "Bacteria" "Nitrospirota" "Thermodesulfovibrionia" "Thermodesulfovibrionales" "Magnetobacteriaceae" "XYC" "" "" "genus" "GBIF" "11695901" "10718264" 2 ""
"P_XNTHS" "Xanthiosphaera" "accepted" "Protozoa" "Sarcomastigophora" "" "" "" "Xanthiosphaera" "" "" "genus" "GBIF" "9472186" 2 "" "P_XNTHS" "Xanthiosphaera" "accepted" "Protozoa" "Sarcomastigophora" "" "" "" "Xanthiosphaera" "" "" "genus" "GBIF" "9472186" 2 ""
"P_XNTHS_LPPC" "Xanthiosphaera lappacea" "accepted" "Protozoa" "Sarcomastigophora" "" "" "" "Xanthiosphaera" "lappacea" "" "species" "Haeckel" "GBIF" "6123506" "9472186" 2 "" "P_XNTHS_LPPC" "Xanthiosphaera lappacea" "accepted" "Protozoa" "Sarcomastigophora" "" "" "" "Xanthiosphaera" "lappacea" "" "species" "Haeckel" "GBIF" "6123506" "9472186" 2 ""
"B_XNTHB" "Xanthobacter" "accepted" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Hyphomicrobiales" "Xanthobacteraceae" "Xanthobacter" "" "" "genus" "Wiegel et al., 1978" "LPSN" "516929" "1568" 2 "439120008" "B_XNTHB" "Xanthobacter" "accepted" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Hyphomicrobiales" "Xanthobacteraceae" "Xanthobacter" "" "" "genus" "Wiegel et al., 1978" "LPSN" "516929" "1568" 2 "439120008"
@ -51892,6 +51900,7 @@
"B_[FAM]_XPHNMTBC" "Xiphinematobacteraceae" "accepted" "Bacteria" "Verrucomicrobiota" "Verrucomicrobiae" "Chthoniobacterales" "Xiphinematobacteraceae" "" "" "" "family" "GBIF" "10770063" "10733345" 2 "" "B_[FAM]_XPHNMTBC" "Xiphinematobacteraceae" "accepted" "Bacteria" "Verrucomicrobiota" "Verrucomicrobiae" "Chthoniobacterales" "Xiphinematobacteraceae" "" "" "" "family" "GBIF" "10770063" "10733345" 2 ""
"B_XUHSH" "Xuhuaishuia" "synonym" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rhodobacterales" "Rhodobacteraceae" "Xuhuaishuia" "" "" "genus" "Wang et al., 2016" "LPSN" "518921" "1175" "518801" 2 "" "B_XUHSH" "Xuhuaishuia" "synonym" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rhodobacterales" "Rhodobacteraceae" "Xuhuaishuia" "" "" "genus" "Wang et al., 2016" "LPSN" "518921" "1175" "518801" 2 ""
"B_XUHSH_MNGN" "Xuhuaishuia manganoxidans" "synonym" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rhodobacterales" "Rhodobacteraceae" "Xuhuaishuia" "manganoxidans" "" "species" "Wang et al., 2016" "LPSN" "793971" "518921" "793304" 2 "" "B_XUHSH_MNGN" "Xuhuaishuia manganoxidans" "synonym" "Bacteria" "Pseudomonadota" "Alphaproteobacteria" "Rhodobacterales" "Rhodobacteraceae" "Xuhuaishuia" "manganoxidans" "" "species" "Wang et al., 2016" "LPSN" "793971" "518921" "793304" 2 ""
"B_XYC" "XYC" "accepted" "Bacteria" "Nitrospirota" "Thermodesulfovibrionia" "Thermodesulfovibrionales" "Magnetobacteriaceae" "XYC" "" "" "genus" "GBIF" "11695901" "10718264" 2 ""
"B_XYLNB" "Xylanibacillus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Caryophanales" "Paenibacillaceae" "Xylanibacillus" "" "" "genus" "Kukolya et al., 2018" "LPSN" "520351" "1013" 2 "" "B_XYLNB" "Xylanibacillus" "accepted" "Bacteria" "Bacillota" "Bacilli" "Caryophanales" "Paenibacillaceae" "Xylanibacillus" "" "" "genus" "Kukolya et al., 2018" "LPSN" "520351" "1013" 2 ""
"B_XYLNB_CMPS" "Xylanibacillus composti" "accepted" "Bacteria" "Bacillota" "Bacilli" "Caryophanales" "Paenibacillaceae" "Xylanibacillus" "composti" "" "species" "Kukolya et al., 2018" "LPSN" "797542" "520351" 2 "" "B_XYLNB_CMPS" "Xylanibacillus composti" "accepted" "Bacteria" "Bacillota" "Bacilli" "Caryophanales" "Paenibacillaceae" "Xylanibacillus" "composti" "" "species" "Kukolya et al., 2018" "LPSN" "797542" "520351" 2 ""
"B_XBCTR" "Xylanibacter" "synonym" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Prevotellaceae" "Xylanibacter" "" "" "genus" "Hitch et al., 2022" "LPSN" "516940" "1105" "516385" 2 "" "B_XBCTR" "Xylanibacter" "synonym" "Bacteria" "Bacteroidota" "Bacteroidia" "Bacteroidales" "Prevotellaceae" "Xylanibacter" "" "" "genus" "Hitch et al., 2022" "LPSN" "516940" "1105" "516385" 2 ""

Binary file not shown.

View File

@ -33,81 +33,73 @@
library(dplyr) library(dplyr)
library(readr) library(readr)
library(tidyr) library(tidyr)
library(AMR) devtools::load_all()
# Install the WHONET 2022 software on Windows (http://www.whonet.org/software.html), # Install the WHONET 2022 software on Windows (http://www.whonet.org/software.html),
# and copy the folder C:\WHONET\Resources to the data-raw/WHONET/ folder # and copy the folder C:\WHONET\Resources to the data-raw/WHONET/ folder
# (for ASIARS-Net update, also copy C:\WHONET\Codes to the data-raw/WHONET/ folder) # (for ASIARS-Net update, also copy C:\WHONET\Codes to the data-raw/WHONET/ folder)
# Load source data ----
# MICROORGANISMS WHONET CODES ----
whonet_organisms <- read_tsv("data-raw/WHONET/Resources/Organisms.txt", na = c("", "NA", "-"), show_col_types = FALSE) %>% whonet_organisms <- read_tsv("data-raw/WHONET/Resources/Organisms.txt", na = c("", "NA", "-"), show_col_types = FALSE) %>%
# remove old taxonomic names # remove old taxonomic names
filter(TAXONOMIC_STATUS == "C") %>% filter(TAXONOMIC_STATUS == "C") %>%
transmute(ORGANISM_CODE = tolower(WHONET_ORG_CODE), ORGANISM) %>% transmute(ORGANISM_CODE = tolower(WHONET_ORG_CODE), ORGANISM) %>%
# what's wrong here? 'sau' is both S. areus and S. aureus sp. aureus
mutate( mutate(
# what's wrong here? all these are only in the table on subspecies level (where species == subspecies), not on species level
ORGANISM = if_else(ORGANISM_CODE == "sau", "Staphylococcus aureus", ORGANISM), ORGANISM = if_else(ORGANISM_CODE == "sau", "Staphylococcus aureus", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "pam", "Pasteurella multocida", ORGANISM) ORGANISM = if_else(ORGANISM_CODE == "pam", "Pasteurella multocida", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "kpn", "Klebsiella pneumoniae", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "caj", "Campylobacter jejuni", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "mmo", "Morganella morganii", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "sap", "Staphylococcus saprophyticus", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "fne", "Fusobacterium necrophorum", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "fnu", "Fusobacterium nucleatum", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "sdy", "Streptococcus dysgalactiae", ORGANISM),
ORGANISM = if_else(ORGANISM_CODE == "axy", "Achromobacter xylosoxidans", ORGANISM),
# and this one was called Issatchenkia orientalis, but it should be:
ORGANISM = if_else(ORGANISM_CODE == "ckr", "Candida krusei", ORGANISM)
) )
whonet_breakpoints <- read_tsv("data-raw/WHONET/Resources/Breakpoints.txt", na = c("", "NA", "-"), show_col_types = FALSE) %>%
filter(BREAKPOINT_TYPE == "Human", GUIDELINES %in% c("CLSI", "EUCAST"))
whonet_antibiotics <- read_tsv("data-raw/WHONET/Resources/Antibiotics.txt", na = c("", "NA", "-"), show_col_types = FALSE) %>%
arrange(WHONET_ABX_CODE) %>%
distinct(WHONET_ABX_CODE, .keep_all = TRUE)
# Transform data ----
# add some general codes
whonet_organisms <- whonet_organisms %>% whonet_organisms <- whonet_organisms %>%
bind_rows(data.frame( bind_rows(data.frame(
ORGANISM_CODE = c("ebc", "cof"), ORGANISM_CODE = c("ebc", "cof"),
ORGANISM = c("Enterobacterales", "Campylobacter") ORGANISM = c("Enterobacterales", "Campylobacter")
)) ))
breakpoints <- whonet_breakpoints %>% whonet_organisms.bak <- whonet_organisms
mutate(ORGANISM_CODE = tolower(ORGANISM_CODE)) %>% # generate the mo codes and add their names
left_join(whonet_organisms) %>% whonet_organisms <- whonet_organisms.bak %>%
filter(ORGANISM %unlike% "(^cdc |Gram.*variable|virus)") mutate(mo = as.mo(gsub("(sero[a-z]*| complex| nontypable| non[-][a-zA-Z]+|var[.]| not .*|sp[.],.*|, .*variant.*|, .*toxin.*|, microaer.*| beta-haem[.])", "", ORGANISM),
# this ones lack a MO name, they will become "UNKNOWN": keep_synonyms = TRUE,
breakpoints %>% language = "en"),
filter(is.na(ORGANISM)) %>% mo = case_when(ORGANISM %like% "Anaerobic" & ORGANISM %like% "negative" ~ as.mo("B_ANAER-NEG"),
pull(ORGANISM_CODE) %>% ORGANISM %like% "Anaerobic" & ORGANISM %like% "positive" ~ as.mo("B_ANAER-POS"),
unique() ORGANISM %like% "Anaerobic" ~ as.mo("B_ANAER"),
TRUE ~ mo),
mo_name = mo_name(mo,
# Generate new lookup table for microorganisms ---- keep_synonyms = TRUE,
language = "en"))
new_mo_codes <- breakpoints %>% # check if coercion at least resembles the first part (genus)
distinct(ORGANISM_CODE, ORGANISM) %>% new_mo_codes <- whonet_organisms %>%
mutate(ORGANISM = ORGANISM %>%
gsub("Issatchenkia orientalis", "Candida krusei", .) %>%
gsub(", nutritionally variant", "", .) %>%
gsub(", toxin-.*producing", "", .)) %>%
mutate( mutate(
mo = as.mo(ORGANISM, language = NULL, keep_synonyms = FALSE), first_part = sapply(ORGANISM, function(x) strsplit(gsub("[^a-zA-Z _-]+", "", x), " ")[[1]][1], USE.NAMES = FALSE),
mo_name = mo_name(mo, language = NULL) keep = mo_name %like_case% first_part | ORGANISM %like% "Gram " | ORGANISM == "Other" | ORGANISM %like% "anaerobic")
) # update microorganisms.codes with the latest WHONET codes
microorganisms.codes <- microorganisms.codes %>%
# remove all old WHONET codes, whether we (in the end) keep them or not
filter(!toupper(code) %in% toupper(whonet_organisms$ORGANISM_CODE)) %>%
# and add the new ones
bind_rows(new_mo_codes %>%
filter(keep == TRUE) %>%
transmute(code = toupper(ORGANISM_CODE),
mo = mo)) %>%
arrange(code)
# Run this part to update ASIARS-Net:
# Update microorganisms.codes with the latest WHONET codes ---- # start
# these will be changed :
new_mo_codes %>%
mutate(code = toupper(ORGANISM_CODE)) %>%
rename(mo_new = mo) %>%
left_join(microorganisms.codes %>% rename(mo_old = mo)) %>%
filter(mo_old != mo_new)
microorganisms.codes <- microorganisms.codes %>%
filter(!code %in% toupper(new_mo_codes$ORGANISM_CODE)) %>%
bind_rows(new_mo_codes %>% transmute(code = toupper(ORGANISM_CODE), mo = mo) %>% filter(!is.na(mo))) %>%
arrange(code) %>%
as_tibble()
usethis::use_data(microorganisms.codes, overwrite = TRUE, compress = "xz", version = 2)
rm(microorganisms.codes)
devtools::load_all()
# update ASIARS-Net?
asiarsnet <- read_tsv("data-raw/WHONET/Codes/ASIARS_Net_Organisms_ForwardLookup.txt") asiarsnet <- read_tsv("data-raw/WHONET/Codes/ASIARS_Net_Organisms_ForwardLookup.txt")
asiarsnet <- asiarsnet %>% asiarsnet <- asiarsnet %>%
mutate(WHONET_Code = toupper(WHONET_Code)) %>% mutate(WHONET_Code = toupper(WHONET_Code)) %>%
@ -129,21 +121,64 @@ microorganisms.codes <- microorganisms.codes %>%
filter(!code %in% c(insert1$code, insert2$code)) %>% filter(!code %in% c(insert1$code, insert2$code)) %>%
bind_rows(insert1, insert2) %>% bind_rows(insert1, insert2) %>%
arrange(code) arrange(code)
# end
# save to package
usethis::use_data(microorganisms.codes, overwrite = TRUE, compress = "xz", version = 2)
rm(microorganisms.codes)
devtools::load_all()
# Create new breakpoint table ---- # BREAKPOINTS ----
# now that we have the right MO codes, get the breakpoints and convert them
whonet_breakpoints <- read_tsv("data-raw/WHONET/Resources/Breakpoints.txt", na = c("", "NA", "-"), show_col_types = FALSE) %>%
filter(BREAKPOINT_TYPE == "Human", GUIDELINES %in% c("CLSI", "EUCAST"))
whonet_antibiotics <- read_tsv("data-raw/WHONET/Resources/Antibiotics.txt", na = c("", "NA", "-"), show_col_types = FALSE) %>%
arrange(WHONET_ABX_CODE) %>%
distinct(WHONET_ABX_CODE, .keep_all = TRUE)
breakpoints <- whonet_breakpoints %>%
mutate(code = toupper(ORGANISM_CODE)) %>%
left_join(bind_rows(microorganisms.codes,
# GEN (Generic) and ALL (All) are PK/PD codes
data.frame(code = c("ALL", "GEN"),
mo = rep(as.mo("UNKNOWN"), 2))))
# these ones lack a MO name, they cannot be used:
unknown <- breakpoints %>%
filter(is.na(mo)) %>%
pull(code) %>%
unique()
breakpoints %>%
filter(code %in% unknown)
breakpoints <- breakpoints %>%
filter(!is.na(mo))
# and these ones have unknown antibiotics according to WHONET itself:
breakpoints %>%
filter(!WHONET_ABX_CODE %in% whonet_antibiotics$WHONET_ABX_CODE) %>%
count(YEAR, GUIDELINES, WHONET_ABX_CODE) %>%
arrange(desc(YEAR))
# we cannot use them
breakpoints <- breakpoints %>%
filter(WHONET_ABX_CODE %in% whonet_antibiotics$WHONET_ABX_CODE)
# now check with our own antibiotics
breakpoints %>%
filter(!toupper(WHONET_ABX_CODE) %in% antibiotics$ab) %>%
pull(WHONET_ABX_CODE) %>%
unique()
# they are at the moment all old codes that have right replacements in `antibiotics`, so we can use as.ab()
breakpoints_new <- breakpoints %>% breakpoints_new <- breakpoints %>%
# only last 10 years # only last available 10 years
filter(YEAR > as.double(format(Sys.Date(), "%Y")) - 10) %>% filter(YEAR > max(YEAR) - 10) %>%
# "all" and "gen" (general) must become UNKNOWNs:
mutate(ORGANISM_CODE = if_else(ORGANISM_CODE %in% c("all", "gen"), "UNKNOWN", ORGANISM_CODE)) %>%
transmute( transmute(
guideline = paste(GUIDELINES, YEAR), guideline = paste(GUIDELINES, YEAR),
method = TEST_METHOD, method = TEST_METHOD,
site = gsub("Urinary tract infection", "UTI", SITE_OF_INFECTION), site = gsub(".*(UTI|urinary|urine).*", "UTI", SITE_OF_INFECTION, ignore.case = TRUE),
mo = as.mo(ORGANISM_CODE, keep_synonyms = FALSE), mo,
rank_index = case_when( rank_index = case_when(
is.na(mo_rank(mo)) ~ 6, # for UNKNOWN, B_GRAMN, B_ANAER, B_ANAER-NEG, etc.
mo_rank(mo) %like% "(infra|sub)" ~ 1, mo_rank(mo) %like% "(infra|sub)" ~ 1,
mo_rank(mo) == "species" ~ 2, mo_rank(mo) == "species" ~ 2,
mo_rank(mo) == "genus" ~ 3, mo_rank(mo) == "genus" ~ 3,
@ -156,17 +191,22 @@ breakpoints_new <- breakpoints %>%
disk_dose = POTENCY, disk_dose = POTENCY,
breakpoint_S = S, breakpoint_S = S,
breakpoint_R = R, breakpoint_R = R,
uti = SITE_OF_INFECTION %like% "(UTI|urinary|urine)" uti = ifelse(is.na(site), FALSE, site == "UTI")
) %>% ) %>%
# Greek symbols and EM dash symbols are not allowed by CRAN, so replace them with ASCII: # Greek symbols and EM dash symbols are not allowed by CRAN, so replace them with ASCII:
mutate(disk_dose = disk_dose %>% mutate(disk_dose = disk_dose %>%
gsub("μ", "u", ., fixed = TRUE) %>% gsub("μ", "u", ., fixed = TRUE) %>% # this is 'mu', \u03bc
gsub("µ", "u", ., fixed = TRUE) %>% # this is another micro sign, although we cannot see it gsub("µ", "u", ., fixed = TRUE) %>% # this is 'micro', u00b5 (yes, they look the same)
gsub("", "-", ., fixed = TRUE)) %>% gsub("", "-", ., fixed = TRUE)) %>%
arrange(desc(guideline), ab, mo, method) %>% arrange(desc(guideline), ab, mo, method) %>%
filter(!(is.na(breakpoint_S) & is.na(breakpoint_R)) & !is.na(mo) & !is.na(ab)) %>% filter(!(is.na(breakpoint_S) & is.na(breakpoint_R)) & !is.na(mo) & !is.na(ab)) %>%
distinct(guideline, ab, mo, method, site, breakpoint_S, .keep_all = TRUE) distinct(guideline, ab, mo, method, site, breakpoint_S, .keep_all = TRUE)
# check the strange duplicates
breakpoints_new %>%
mutate(id = paste(guideline, ab, mo, method, site)) %>%
filter(id %in% .$id[which(duplicated(id))])
# clean disk zones and MICs # clean disk zones and MICs
breakpoints_new[which(breakpoints_new$method == "DISK"), "breakpoint_S"] <- as.double(as.disk(breakpoints_new[which(breakpoints_new$method == "DISK"), "breakpoint_S", drop = TRUE])) breakpoints_new[which(breakpoints_new$method == "DISK"), "breakpoint_S"] <- as.double(as.disk(breakpoints_new[which(breakpoints_new$method == "DISK"), "breakpoint_S", drop = TRUE]))
breakpoints_new[which(breakpoints_new$method == "DISK"), "breakpoint_R"] <- as.double(as.disk(breakpoints_new[which(breakpoints_new$method == "DISK"), "breakpoint_R", drop = TRUE])) breakpoints_new[which(breakpoints_new$method == "DISK"), "breakpoint_R"] <- as.double(as.disk(breakpoints_new[which(breakpoints_new$method == "DISK"), "breakpoint_R", drop = TRUE]))
@ -185,7 +225,7 @@ breakpoints_new[which(breakpoints_new$breakpoint_R == 513), "breakpoint_R"] <- m
breakpoints_new[which(breakpoints_new$breakpoint_R == 1025), "breakpoint_R"] <- m[which(m == 1024) + 1] breakpoints_new[which(breakpoints_new$breakpoint_R == 1025), "breakpoint_R"] <- m[which(m == 1024) + 1]
# WHONET adds one log2 level to the R breakpoint for their software, e.g. in AMC in Enterobacterales: # WHONET adds one log2 level to the R breakpoint for their software, e.g. in AMC in Enterobacterales:
# EUCAST 2021 guideline: S <= 8 and R > 8 # EUCAST 2022 guideline: S <= 8 and R > 8
# WHONET file: S <= 8 and R >= 16 # WHONET file: S <= 8 and R >= 16
breakpoints_new %>% filter(guideline == "EUCAST 2022", ab == "AMC", mo == "B_[ORD]_ENTRBCTR", method == "MIC") breakpoints_new %>% filter(guideline == "EUCAST 2022", ab == "AMC", mo == "B_[ORD]_ENTRBCTR", method == "MIC")
# this will make an MIC of 12 I, which should be R, so: # this will make an MIC of 12 I, which should be R, so:
@ -208,6 +248,11 @@ breakpoints_new %>% filter(guideline == "EUCAST 2022", ab == "AMC", mo == "B_[OR
# compare with current version # compare with current version
clinical_breakpoints %>% filter(guideline == "EUCAST 2022", ab == "AMC", mo == "B_[ORD]_ENTRBCTR", method == "MIC") clinical_breakpoints %>% filter(guideline == "EUCAST 2022", ab == "AMC", mo == "B_[ORD]_ENTRBCTR", method == "MIC")
# check dimensions
dim(breakpoints_new)
dim(clinical_breakpoints)
# Save to package ---- # Save to package ----
clinical_breakpoints <- breakpoints_new clinical_breakpoints <- breakpoints_new

View File

@ -147,23 +147,6 @@ df_remove_nonASCII <- function(df) {
AMR:::dataset_UTF8_to_ASCII() AMR:::dataset_UTF8_to_ASCII()
} }
abbreviate_mo <- function(x, minlength = 5, prefix = "", hyphen_as_space = FALSE, ...) {
if (hyphen_as_space == TRUE) {
x <- gsub("-", " ", x, fixed = TRUE)
}
# keep a starting Latin ae
suppressWarnings(
gsub("^ae", "\u00E6\u00E6", x, ignore.case = TRUE) %>%
abbreviate(
minlength = minlength,
use.classes = TRUE,
method = "both.sides", ...
) %>%
paste0(prefix, .) %>%
toupper() %>%
gsub("(\u00C6|\u00E6)+", "AE", .)
)
}
# to retrieve LPSN and authors from LPSN website # to retrieve LPSN and authors from LPSN website
get_lpsn_and_author <- function(rank, name) { get_lpsn_and_author <- function(rank, name) {
@ -936,8 +919,8 @@ mo_phylum <- taxonomy %>%
) %>% ) %>%
group_by(kingdom) %>% group_by(kingdom) %>%
mutate( mutate(
mo_phylum8 = abbreviate_mo(phylum, minlength = 8, prefix = "[PHL]_"), mo_phylum8 = AMR:::abbreviate_mo(phylum, minlength = 8, prefix = "[PHL]_"),
mo_phylum9 = abbreviate_mo(phylum, minlength = 9, prefix = "[PHL]_"), mo_phylum9 = AMR:::abbreviate_mo(phylum, minlength = 9, prefix = "[PHL]_"),
mo_phylum = ifelse(!is.na(mo_old), mo_old, mo_phylum8), mo_phylum = ifelse(!is.na(mo_old), mo_old, mo_phylum8),
mo_duplicated = duplicated(mo_phylum), mo_duplicated = duplicated(mo_phylum),
mo_phylum = ifelse(mo_duplicated, mo_phylum9, mo_phylum), mo_phylum = ifelse(mo_duplicated, mo_phylum9, mo_phylum),
@ -963,8 +946,8 @@ mo_class <- taxonomy %>%
) %>% ) %>%
group_by(kingdom) %>% group_by(kingdom) %>%
mutate( mutate(
mo_class8 = abbreviate_mo(class, minlength = 8, prefix = "[CLS]_"), mo_class8 = AMR:::abbreviate_mo(class, minlength = 8, prefix = "[CLS]_"),
mo_class9 = abbreviate_mo(class, minlength = 9, prefix = "[CLS]_"), mo_class9 = AMR:::abbreviate_mo(class, minlength = 9, prefix = "[CLS]_"),
mo_class = ifelse(!is.na(mo_old), mo_old, mo_class8), mo_class = ifelse(!is.na(mo_old), mo_old, mo_class8),
mo_duplicated = duplicated(mo_class), mo_duplicated = duplicated(mo_class),
mo_class = ifelse(mo_duplicated, mo_class9, mo_class), mo_class = ifelse(mo_duplicated, mo_class9, mo_class),
@ -990,8 +973,8 @@ mo_order <- taxonomy %>%
) %>% ) %>%
group_by(kingdom) %>% group_by(kingdom) %>%
mutate( mutate(
mo_order8 = abbreviate_mo(order, minlength = 8, prefix = "[ORD]_"), mo_order8 = AMR:::abbreviate_mo(order, minlength = 8, prefix = "[ORD]_"),
mo_order9 = abbreviate_mo(order, minlength = 9, prefix = "[ORD]_"), mo_order9 = AMR:::abbreviate_mo(order, minlength = 9, prefix = "[ORD]_"),
mo_order = ifelse(!is.na(mo_old), mo_old, mo_order8), mo_order = ifelse(!is.na(mo_old), mo_old, mo_order8),
mo_duplicated = duplicated(mo_order), mo_duplicated = duplicated(mo_order),
mo_order = ifelse(mo_duplicated, mo_order9, mo_order), mo_order = ifelse(mo_duplicated, mo_order9, mo_order),
@ -1017,8 +1000,8 @@ mo_family <- taxonomy %>%
) %>% ) %>%
group_by(kingdom) %>% group_by(kingdom) %>%
mutate( mutate(
mo_family8 = abbreviate_mo(family, minlength = 8, prefix = "[FAM]_"), mo_family8 = AMR:::abbreviate_mo(family, minlength = 8, prefix = "[FAM]_"),
mo_family9 = abbreviate_mo(family, minlength = 9, prefix = "[FAM]_"), mo_family9 = AMR:::abbreviate_mo(family, minlength = 9, prefix = "[FAM]_"),
mo_family = ifelse(!is.na(mo_old), mo_old, mo_family8), mo_family = ifelse(!is.na(mo_old), mo_old, mo_family8),
mo_duplicated = duplicated(mo_family), mo_duplicated = duplicated(mo_family),
mo_family = ifelse(mo_duplicated, mo_family9, mo_family), mo_family = ifelse(mo_duplicated, mo_family9, mo_family),
@ -1046,11 +1029,11 @@ mo_genus <- taxonomy %>%
group_by(kingdom) %>% group_by(kingdom) %>%
# generate new MO codes for genus and set the right one # generate new MO codes for genus and set the right one
mutate( mutate(
mo_genus_new5 = abbreviate_mo(genus, 5), mo_genus_new5 = AMR:::abbreviate_mo(genus, 5),
mo_genus_new5b = paste0(abbreviate_mo(genus, 5), 1), mo_genus_new5b = paste0(AMR:::abbreviate_mo(genus, 5), 1),
mo_genus_new6 = abbreviate_mo(genus, 6), mo_genus_new6 = AMR:::abbreviate_mo(genus, 6),
mo_genus_new7 = abbreviate_mo(genus, 7), mo_genus_new7 = AMR:::abbreviate_mo(genus, 7),
mo_genus_new8 = abbreviate_mo(genus, 8), mo_genus_new8 = AMR:::abbreviate_mo(genus, 8),
mo_genus_new = case_when( mo_genus_new = case_when(
!is.na(mo_genus_old) ~ mo_genus_old, !is.na(mo_genus_old) ~ mo_genus_old,
!mo_genus_new5 %in% mo_genus_old ~ mo_genus_new5, !mo_genus_new5 %in% mo_genus_old ~ mo_genus_new5,
@ -1092,12 +1075,12 @@ mo_species <- taxonomy %>%
distinct(kingdom, genus, species, .keep_all = TRUE) %>% distinct(kingdom, genus, species, .keep_all = TRUE) %>%
group_by(kingdom, genus) %>% group_by(kingdom, genus) %>%
mutate( mutate(
mo_species_new4 = abbreviate_mo(species, 4, hyphen_as_space = TRUE), mo_species_new4 = AMR:::abbreviate_mo(species, 4, hyphen_as_space = TRUE),
mo_species_new5 = abbreviate_mo(species, 5, hyphen_as_space = TRUE), mo_species_new5 = AMR:::abbreviate_mo(species, 5, hyphen_as_space = TRUE),
mo_species_new5b = paste0(abbreviate_mo(species, 5, hyphen_as_space = TRUE), 1), mo_species_new5b = paste0(AMR:::abbreviate_mo(species, 5, hyphen_as_space = TRUE), 1),
mo_species_new6 = abbreviate_mo(species, 6, hyphen_as_space = TRUE), mo_species_new6 = AMR:::abbreviate_mo(species, 6, hyphen_as_space = TRUE),
mo_species_new7 = abbreviate_mo(species, 7, hyphen_as_space = TRUE), mo_species_new7 = AMR:::abbreviate_mo(species, 7, hyphen_as_space = TRUE),
mo_species_new8 = abbreviate_mo(species, 8, hyphen_as_space = TRUE), mo_species_new8 = AMR:::abbreviate_mo(species, 8, hyphen_as_space = TRUE),
mo_species_new = case_when( mo_species_new = case_when(
!is.na(mo_species_old) ~ mo_species_old, !is.na(mo_species_old) ~ mo_species_old,
!mo_species_new4 %in% mo_species_old ~ mo_species_new4, !mo_species_new4 %in% mo_species_old ~ mo_species_new4,
@ -1141,12 +1124,12 @@ mo_subspecies <- taxonomy %>%
distinct(kingdom, genus, species, subspecies, .keep_all = TRUE) %>% distinct(kingdom, genus, species, subspecies, .keep_all = TRUE) %>%
group_by(kingdom, genus, species) %>% group_by(kingdom, genus, species) %>%
mutate( mutate(
mo_subspecies_new4 = abbreviate_mo(subspecies, 4, hyphen_as_space = TRUE), mo_subspecies_new4 = AMR:::abbreviate_mo(subspecies, 4, hyphen_as_space = TRUE),
mo_subspecies_new5 = abbreviate_mo(subspecies, 5, hyphen_as_space = TRUE), mo_subspecies_new5 = AMR:::abbreviate_mo(subspecies, 5, hyphen_as_space = TRUE),
mo_subspecies_new5b = paste0(abbreviate_mo(subspecies, 5, hyphen_as_space = TRUE), 1), mo_subspecies_new5b = paste0(AMR:::abbreviate_mo(subspecies, 5, hyphen_as_space = TRUE), 1),
mo_subspecies_new6 = abbreviate_mo(subspecies, 6, hyphen_as_space = TRUE), mo_subspecies_new6 = AMR:::abbreviate_mo(subspecies, 6, hyphen_as_space = TRUE),
mo_subspecies_new7 = abbreviate_mo(subspecies, 7, hyphen_as_space = TRUE), mo_subspecies_new7 = AMR:::abbreviate_mo(subspecies, 7, hyphen_as_space = TRUE),
mo_subspecies_new8 = abbreviate_mo(subspecies, 8, hyphen_as_space = TRUE), mo_subspecies_new8 = AMR:::abbreviate_mo(subspecies, 8, hyphen_as_space = TRUE),
mo_subspecies_new = case_when( mo_subspecies_new = case_when(
!is.na(mo_subspecies_old) ~ mo_subspecies_old, !is.na(mo_subspecies_old) ~ mo_subspecies_old,
!mo_subspecies_new4 %in% mo_subspecies_old ~ mo_subspecies_new4, !mo_subspecies_new4 %in% mo_subspecies_old ~ mo_subspecies_new4,
@ -1348,6 +1331,69 @@ taxonomy <- taxonomy %>%
left_join(snomed, by = "fullname") left_join(snomed, by = "fullname")
# Add oxygen tolerance (aerobe/anaerobe) ----------------------------------
# We will use the BacDive data base for this:
# - go to https://bacdive.dsmz.de/advsearch and filter 'Oxygen tolerance' on "*"
# - click on the 'Download tabel as CSV' button
#
bacdive <- vroom::vroom("data-raw/bacdive.csv", skip = 2) %>%
select(species, oxygen = `Oxygen tolerance`)
bacdive <- bacdive %>%
# fill in missing species from previous rows
mutate(species = ifelse(is.na(species), lag(species), species)) %>%
filter(!is.na(species), !is.na(oxygen), oxygen %unlike% "tolerant")
bacdive <- bacdive %>%
# now determine type per species
group_by(species) %>%
summarise(oxygen_tolerance = case_when(any(oxygen %like% "facultative") ~ "facultative anaerobe",
all(oxygen == "microaerophile") ~ "microaerophile",
all(oxygen %in% c("anaerobe", "obligate anaerobe")) ~ "anaerobe",
all(oxygen %in% c("anaerobe", "obligate anaerobe", "microaerophile")) ~ "anaerobe/microaerophile",
all(oxygen %in% c("aerobe", "obligate aerobe")) ~ "aerobe",
all(!oxygen %in% c("anaerobe", "obligate anaerobe")) ~ "aerobe",
all(c("aerobe", "anaerobe") %in% oxygen) ~ "facultative anaerobe",
TRUE ~ NA_character_))
bacdive_genus <- bacdive %>%
mutate(genus = gsub("^([A-Za-z]+) .*", "\\1", species), oxygen = oxygen_tolerance) %>%
group_by(species = genus) %>%
summarise(oxygen_tolerance = case_when(any(oxygen == "facultative anaerobe") ~ "facultative anaerobe",
any(oxygen == "anaerobe/microaerophile") ~ "anaerobe/microaerophile",
all(oxygen == "microaerophile") ~ "microaerophile",
all(oxygen == "anaerobe") ~ "anaerobe",
all(oxygen == "aerobe") ~ "aerobe",
TRUE ~ "facultative anaerobe"))
bacdive <- bacdive %>%
filter(species %unlike% " sp[.]") %>%
bind_rows(bacdive_genus) %>%
arrange(species) %>%
mutate(mo = as.mo(species, keep_synonyms = FALSE))
other_species <- microorganisms %>%
filter(kingdom == "Bacteria", rank == "species", !mo %in% bacdive$mo, genus %in% bacdive$species) %>%
select(species = fullname, genus, mo2 = mo) %>%
left_join(bacdive, by = c("genus" = "species")) %>%
mutate(oxygen_tolerance = ifelse(oxygen_tolerance %in% c("aerobe", "anaerobe", "microaerophile", "anaerobe/microaerophile"),
oxygen_tolerance,
paste("likely", oxygen_tolerance))) %>%
select(species, oxygen_tolerance, mo = mo2)
bacdive <- bacdive %>%
bind_rows(other_species) %>%
arrange(species)
taxonomy <- taxonomy %>%
left_join(
bacdive %>%
select(-species),
by = "mo") %>%
# TODO look up synonyms and fill them in as well
# Clean data set ---------------------------------------------------------- # Clean data set ----------------------------------------------------------
# format to tibble and check again for invalid characters # format to tibble and check again for invalid characters
@ -1380,6 +1426,9 @@ for (nm in to_restore) {
# Save to package --------------------------------------------------------- # Save to package ---------------------------------------------------------
# set class <mo> if still needed (if you run only this part coming from other scripts)
class(microorganisms$mo) <- c("mo", "character")
microorganisms <- microorganisms %>% arrange(fullname)
usethis::use_data(microorganisms, overwrite = TRUE, version = 2, compress = "xz") usethis::use_data(microorganisms, overwrite = TRUE, version = 2, compress = "xz")
rm(microorganisms) rm(microorganisms)

View File

@ -6,6 +6,8 @@ Coagulase-positive Staphylococcus TRUE TRUE FALSE TRUE 凝固酶阳性葡萄球
Beta-haemolytic Streptococcus TRUE TRUE FALSE TRUE β-溶血性链球菌 Beta-hemolytický streptokok Beta-haemolytiske streptokokker Beta-hemolytische Streptococcus Beeta-hemolyyttinen streptokokki Streptococcus Bêta-hémolytique Beta-hämolytischer Streptococcus Β-αιμολυτικός στρεπτόκοκκος Streptococcus Beta-emolitico ベータ溶血性レンサ球菌 Beta-hemolytiske streptokokker Streptococcus beta-hemolityczny Streptococcus Beta-hemolítico Streptococ beta-hemolitic Бета-гемолитический стрептококк Streptococcus Beta-hemolítico Beta-hemolytiska streptokocker Beta-hemolitik Streptokok Бета-гемолітичний стрептокок Beta-haemolytic Streptococcus TRUE TRUE FALSE TRUE β-溶血性链球菌 Beta-hemolytický streptokok Beta-haemolytiske streptokokker Beta-hemolytische Streptococcus Beeta-hemolyyttinen streptokokki Streptococcus Bêta-hémolytique Beta-hämolytischer Streptococcus Β-αιμολυτικός στρεπτόκοκκος Streptococcus Beta-emolitico ベータ溶血性レンサ球菌 Beta-hemolytiske streptokokker Streptococcus beta-hemolityczny Streptococcus Beta-hemolítico Streptococ beta-hemolitic Бета-гемолитический стрептококк Streptococcus Beta-hemolítico Beta-hemolytiska streptokocker Beta-hemolitik Streptokok Бета-гемолітичний стрептокок
unknown Gram-negatives TRUE TRUE FALSE TRUE 不明革兰氏阴性菌 neznámé gramnegativní ukendte Gram-negative onbekende Gram-negatieven tuntemattomat gramnegatiiviset Gram négatifs inconnus unbekannte Gramnegativen άγνωστοι αρνητικοί κατά Gram Gram negativi sconosciuti 不明なグラム陰性菌 ukjent Gram-negative Nieznane bakterie Gram-ujemne Gram negativos desconhecidos Gram-negative necunoscute неизвестные грамотрицательные Gram negativos desconocidos okända gramnegativa bakterier bilinmeyen Gram-negatifler невідомі грамнегативні unknown Gram-negatives TRUE TRUE FALSE TRUE 不明革兰氏阴性菌 neznámé gramnegativní ukendte Gram-negative onbekende Gram-negatieven tuntemattomat gramnegatiiviset Gram négatifs inconnus unbekannte Gramnegativen άγνωστοι αρνητικοί κατά Gram Gram negativi sconosciuti 不明なグラム陰性菌 ukjent Gram-negative Nieznane bakterie Gram-ujemne Gram negativos desconhecidos Gram-negative necunoscute неизвестные грамотрицательные Gram negativos desconocidos okända gramnegativa bakterier bilinmeyen Gram-negatifler невідомі грамнегативні
unknown Gram-positives TRUE TRUE FALSE TRUE 不明革兰氏阳性菌 neznámé grampozitivní ukendte Gram-positive onbekende Gram-positieven tuntemattomat grampositiiviset Gram positifs inconnus unbekannte Grampositiven άγνωστοι θετικοί κατά Gram Gram positivi sconosciuti 未知のグラム陽性菌 ukjent Gram-positive Nieznane bakterie Gram-dodatnie Gram positivos desconhecidos Gram-pozitive necunoscute неизвестные грамположительные Gram positivos desconocidos okända Gram-positiva bilinmeyen Gram-pozitifler невідомі грампозитивні unknown Gram-positives TRUE TRUE FALSE TRUE 不明革兰氏阳性菌 neznámé grampozitivní ukendte Gram-positive onbekende Gram-positieven tuntemattomat grampositiiviset Gram positifs inconnus unbekannte Grampositiven άγνωστοι θετικοί κατά Gram Gram positivi sconosciuti 未知のグラム陽性菌 ukjent Gram-positive Nieznane bakterie Gram-dodatnie Gram positivos desconhecidos Gram-pozitive necunoscute неизвестные грамположительные Gram positivos desconocidos okända Gram-positiva bilinmeyen Gram-pozitifler невідомі грампозитивні
unknown anaerobic Gram-negatives TRUE TRUE FALSE TRUE ukendte anaerobe Gram-negative onbekende anaerobe Gram-negatieven unbekannte anaerobe Gramnegativen
unknown anaerobic Gram-positives TRUE TRUE FALSE TRUE ukendte anaerobe Gram-positive onbekende anaerobe Gram-positieven unbekannte anaerobe Grampositiven
unknown fungus TRUE TRUE FALSE TRUE 未知真菌 neznámé houby ukendt svamp onbekende schimmel tuntematon sieni champignon inconnu unbekannter Pilze άγνωστος μύκητας fungo sconosciuto 未知真菌 ukjent sopp Nieznany grzyb fungo desconhecido ciuperci necunoscute неизвестный грибок hongo desconocido Okänd svamp bilinmeyen mantar невідомий гриб unknown fungus TRUE TRUE FALSE TRUE 未知真菌 neznámé houby ukendt svamp onbekende schimmel tuntematon sieni champignon inconnu unbekannter Pilze άγνωστος μύκητας fungo sconosciuto 未知真菌 ukjent sopp Nieznany grzyb fungo desconhecido ciuperci necunoscute неизвестный грибок hongo desconocido Okänd svamp bilinmeyen mantar невідомий гриб
unknown yeast TRUE TRUE FALSE TRUE 未知酵母菌 neznámé kvasinky ukendt gær onbekende gist tuntematon hiiva levure inconnue unbekannte Hefe άγνωστος ζυμομύκητας lievito sconosciuto 未知酵母 ukjent gjær Nieznany drożdżak levedura desconhecida drojdie necunoscută неизвестные дрожжи levadura desconocida Okänd jäst bilinmeyen maya невідомі дріжджі unknown yeast TRUE TRUE FALSE TRUE 未知酵母菌 neznámé kvasinky ukendt gær onbekende gist tuntematon hiiva levure inconnue unbekannte Hefe άγνωστος ζυμομύκητας lievito sconosciuto 未知酵母 ukjent gjær Nieznany drożdżak levedura desconhecida drojdie necunoscută неизвестные дрожжи levadura desconocida Okänd jäst bilinmeyen maya невідомі дріжджі
unknown name TRUE TRUE FALSE TRUE 不明名称 neznámý název ukendt navn onbekende naam tuntematon nimi nom inconnu unbekannte Name άγνωστο όνομα nome sconosciuto 名称未知 ukjent navn nieznana nazwa nome desconhecido nume necunoscut неизвестное название nombre desconocido okänt namn bilinmeyen isim невідома назва unknown name TRUE TRUE FALSE TRUE 不明名称 neznámý název ukendt navn onbekende naam tuntematon nimi nom inconnu unbekannte Name άγνωστο όνομα nome sconosciuto 名称未知 ukjent navn nieznana nazwa nome desconhecido nume necunoscut неизвестное название nombre desconocido okänt namn bilinmeyen isim невідома назва

1 pattern regular_expr case_sensitive affect_ab_name affect_mo_name zh cs da nl fi fr de el it ja no pl pt ro ru es sv tr uk
6 Beta-haemolytic Streptococcus TRUE TRUE FALSE TRUE β-溶血性链球菌 Beta-hemolytický streptokok Beta-haemolytiske streptokokker Beta-hemolytische Streptococcus Beeta-hemolyyttinen streptokokki Streptococcus Bêta-hémolytique Beta-hämolytischer Streptococcus Β-αιμολυτικός στρεπτόκοκκος Streptococcus Beta-emolitico ベータ溶血性レンサ球菌 Beta-hemolytiske streptokokker Streptococcus beta-hemolityczny Streptococcus Beta-hemolítico Streptococ beta-hemolitic Бета-гемолитический стрептококк Streptococcus Beta-hemolítico Beta-hemolytiska streptokocker Beta-hemolitik Streptokok Бета-гемолітичний стрептокок
7 unknown Gram-negatives TRUE TRUE FALSE TRUE 不明革兰氏阴性菌 neznámé gramnegativní ukendte Gram-negative onbekende Gram-negatieven tuntemattomat gramnegatiiviset Gram négatifs inconnus unbekannte Gramnegativen άγνωστοι αρνητικοί κατά Gram Gram negativi sconosciuti 不明なグラム陰性菌 ukjent Gram-negative Nieznane bakterie Gram-ujemne Gram negativos desconhecidos Gram-negative necunoscute неизвестные грамотрицательные Gram negativos desconocidos okända gramnegativa bakterier bilinmeyen Gram-negatifler невідомі грамнегативні
8 unknown Gram-positives TRUE TRUE FALSE TRUE 不明革兰氏阳性菌 neznámé grampozitivní ukendte Gram-positive onbekende Gram-positieven tuntemattomat grampositiiviset Gram positifs inconnus unbekannte Grampositiven άγνωστοι θετικοί κατά Gram Gram positivi sconosciuti 未知のグラム陽性菌 ukjent Gram-positive Nieznane bakterie Gram-dodatnie Gram positivos desconhecidos Gram-pozitive necunoscute неизвестные грамположительные Gram positivos desconocidos okända Gram-positiva bilinmeyen Gram-pozitifler невідомі грампозитивні
9 unknown anaerobic Gram-negatives TRUE TRUE FALSE TRUE ukendte anaerobe Gram-negative onbekende anaerobe Gram-negatieven unbekannte anaerobe Gramnegativen
10 unknown anaerobic Gram-positives TRUE TRUE FALSE TRUE ukendte anaerobe Gram-positive onbekende anaerobe Gram-positieven unbekannte anaerobe Grampositiven
11 unknown fungus TRUE TRUE FALSE TRUE 未知真菌 neznámé houby ukendt svamp onbekende schimmel tuntematon sieni champignon inconnu unbekannter Pilze άγνωστος μύκητας fungo sconosciuto 未知真菌 ukjent sopp Nieznany grzyb fungo desconhecido ciuperci necunoscute неизвестный грибок hongo desconocido Okänd svamp bilinmeyen mantar невідомий гриб
12 unknown yeast TRUE TRUE FALSE TRUE 未知酵母菌 neznámé kvasinky ukendt gær onbekende gist tuntematon hiiva levure inconnue unbekannte Hefe άγνωστος ζυμομύκητας lievito sconosciuto 未知酵母 ukjent gjær Nieznany drożdżak levedura desconhecida drojdie necunoscută неизвестные дрожжи levadura desconocida Okänd jäst bilinmeyen maya невідомі дріжджі
13 unknown name TRUE TRUE FALSE TRUE 不明名称 neznámý název ukendt navn onbekende naam tuntematon nimi nom inconnu unbekannte Name άγνωστο όνομα nome sconosciuto 名称未知 ukjent navn nieznana nazwa nome desconhecido nume necunoscut неизвестное название nombre desconocido okänt namn bilinmeyen isim невідома назва

Binary file not shown.

Binary file not shown.

Binary file not shown.

View File

@ -279,13 +279,8 @@ expect_equal(suppressWarnings(as.mo("Virus")), as.mo("UNKNOWN"))
expect_equal(length(summary(example_isolates$mo)), 6) expect_equal(length(summary(example_isolates$mo)), 6)
# WHONET codes and NA/NaN # WHONET codes and NA/NaN
expect_equal( expect_true(all(is.na(as.mo(c("xxx", "na", "nan")))))
as.character(as.mo(c("xxx", "na", "nan"), debug = TRUE)), expect_equal(as.character(as.mo(c("con", "eco"))), c("UNKNOWN", "B_ESCHR_COLI"))
rep(NA_character_, 3)
)
expect_equal(as.character(as.mo("con")), "UNKNOWN")
expect_equal(as.character(as.mo("xxx")), NA_character_)
expect_equal(as.character(as.mo(c("xxx", "con", "eco"))), c(NA_character_, "UNKNOWN", "B_ESCHR_COLI"))
expect_equal( expect_equal(
as.character(suppressWarnings(as.mo(c("other", "none", "unknown")))), as.character(suppressWarnings(as.mo(c("other", "none", "unknown")))),
rep("UNKNOWN", 3) rep("UNKNOWN", 3)

View File

@ -27,7 +27,7 @@
# how to conduct AMR data analysis: https://msberends.github.io/AMR/ # # how to conduct AMR data analysis: https://msberends.github.io/AMR/ #
# ==================================================================== # # ==================================================================== #
expect_identical(mo_genus("B_GRAMP", language = "pt"), "(Gram positivos desconhecidos)") expect_identical(mo_genus("B_GRAMP", language = "pt"), "(gênero desconhecido)")
expect_identical(mo_fullname("CoNS", "cs"), "Koaguláza-negativní stafylokok (KNS)") expect_identical(mo_fullname("CoNS", "cs"), "Koaguláza-negativní stafylokok (KNS)")
expect_identical(mo_fullname("CoNS", "da"), "Koagulase-negative stafylokokker (KNS)") expect_identical(mo_fullname("CoNS", "da"), "Koagulase-negative stafylokokker (KNS)")

View File

@ -247,7 +247,7 @@ ureido <- antibiogram(example_isolates,
# in an Rmd file, you would just need to return `ureido` in a chunk, # in an Rmd file, you would just need to return `ureido` in a chunk,
# but to be explicit here: # but to be explicit here:
if (requireNamespace("knitr")) { if (requireNamespace("knitr")) {
knitr::knit_print(ureido) cat(knitr::knit_print(ureido))
} }

View File

@ -160,7 +160,7 @@ Furthermore,
\item Any genus present in the \strong{established} list also has \code{prevalence = 1.0} in the \link{microorganisms} data set; \item Any genus present in the \strong{established} list also has \code{prevalence = 1.0} in the \link{microorganisms} data set;
\item Any other genus present in the \strong{putative} list has \code{prevalence = 1.25} in the \link{microorganisms} data set; \item Any other genus present in the \strong{putative} list has \code{prevalence = 1.25} in the \link{microorganisms} data set;
\item Any other species or subspecies of which the genus is present in the two aforementioned groups, has \code{prevalence = 1.5} in the \link{microorganisms} data set; \item Any other species or subspecies of which the genus is present in the two aforementioned groups, has \code{prevalence = 1.5} in the \link{microorganisms} data set;
\item Any \emph{non-bacterial} genus, species or subspecies of which the genus is present in the following list, has \code{prevalence = 1.5} in the \link{microorganisms} data set: \emph{Absidia}, \emph{Acanthamoeba}, \emph{Acremonium}, \emph{Aedes}, \emph{Alternaria}, \emph{Amoeba}, \emph{Ancylostoma}, \emph{Angiostrongylus}, \emph{Anisakis}, \emph{Anopheles}, \emph{Apophysomyces}, \emph{Aspergillus}, \emph{Aureobasidium}, \emph{Basidiobolus}, \emph{Beauveria}, \emph{Blastocystis}, \emph{Blastomyces}, \emph{Candida}, \emph{Capillaria}, \emph{Chaetomium}, \emph{Chrysonilia}, \emph{Cladophialophora}, \emph{Cladosporium}, \emph{Conidiobolus}, \emph{Contracaecum}, \emph{Cordylobia}, \emph{Cryptococcus}, \emph{Curvularia}, \emph{Demodex}, \emph{Dermatobia}, \emph{Dientamoeba}, \emph{Diphyllobothrium}, \emph{Dirofilaria}, \emph{Echinostoma}, \emph{Entamoeba}, \emph{Enterobius}, \emph{Exophiala}, \emph{Exserohilum}, \emph{Fasciola}, \emph{Fonsecaea}, \emph{Fusarium}, \emph{Giardia}, \emph{Haloarcula}, \emph{Halobacterium}, \emph{Halococcus}, \emph{Hendersonula}, \emph{Heterophyes}, \emph{Histomonas}, \emph{Histoplasma}, \emph{Hymenolepis}, \emph{Hypomyces}, \emph{Hysterothylacium}, \emph{Leishmania}, \emph{Malassezia}, \emph{Malbranchea}, \emph{Metagonimus}, \emph{Meyerozyma}, \emph{Microsporidium}, \emph{Microsporum}, \emph{Mortierella}, \emph{Mucor}, \emph{Mycocentrospora}, \emph{Necator}, \emph{Nectria}, \emph{Ochroconis}, \emph{Oesophagostomum}, \emph{Oidiodendron}, \emph{Opisthorchis}, \emph{Pediculus}, \emph{Phlebotomus}, \emph{Phoma}, \emph{Pichia}, \emph{Piedraia}, \emph{Pithomyces}, \emph{Pityrosporum}, \emph{Pneumocystis}, \emph{Pseudallescheria}, \emph{Pseudoterranova}, \emph{Pulex}, \emph{Rhizomucor}, \emph{Rhizopus}, \emph{Rhodotorula}, \emph{Saccharomyces}, \emph{Sarcoptes}, \emph{Scolecobasidium}, \emph{Scopulariopsis}, \emph{Scytalidium}, \emph{Spirometra}, \emph{Sporobolomyces}, \emph{Stachybotrys}, \emph{Strongyloides}, \emph{Syngamus}, \emph{Taenia}, \emph{Toxocara}, \emph{Trichinella}, \emph{Trichobilharzia}, \emph{Trichoderma}, \emph{Trichomonas}, \emph{Trichophyton}, \emph{Trichosporon}, \emph{Trichostrongylus}, \emph{Trichuris}, \emph{Tritirachium}, \emph{Trombicula}, \emph{Trypanosoma}, \emph{Tunga}, or \emph{Wuchereria}; \item Any \emph{non-bacterial} genus, species or subspecies of which the genus is present in the following list, has \code{prevalence = 1.5} in the \link{microorganisms} data set: \emph{Absidia}, \emph{Acanthamoeba}, \emph{Acremonium}, \emph{Aedes}, \emph{Alternaria}, \emph{Amoeba}, \emph{Ancylostoma}, \emph{Angiostrongylus}, \emph{Anisakis}, \emph{Anopheles}, \emph{Apophysomyces}, \emph{Aspergillus}, \emph{Aureobasidium}, \emph{Basidiobolus}, \emph{Beauveria}, \emph{Blastocystis}, \emph{Blastomyces}, \emph{Candida}, \emph{Capillaria}, \emph{Chaetomium}, \emph{Chrysonilia}, \emph{Cladophialophora}, \emph{Cladosporium}, \emph{Conidiobolus}, \emph{Contracaecum}, \emph{Cordylobia}, \emph{Cryptococcus}, \emph{Curvularia}, \emph{Demodex}, \emph{Dermatobia}, \emph{Dientamoeba}, \emph{Diphyllobothrium}, \emph{Dirofilaria}, \emph{Echinostoma}, \emph{Entamoeba}, \emph{Enterobius}, \emph{Exophiala}, \emph{Exserohilum}, \emph{Fasciola}, \emph{Fonsecaea}, \emph{Fusarium}, \emph{Giardia}, \emph{Haloarcula}, \emph{Halobacterium}, \emph{Halococcus}, \emph{Hendersonula}, \emph{Heterophyes}, \emph{Histomonas}, \emph{Histoplasma}, \emph{Hymenolepis}, \emph{Hypomyces}, \emph{Hysterothylacium}, \emph{Leishmania}, \emph{Malassezia}, \emph{Malbranchea}, \emph{Metagonimus}, \emph{Meyerozyma}, \emph{Microsporidium}, \emph{Microsporum}, \emph{Mortierella}, \emph{Mucor}, \emph{Mycocentrospora}, \emph{Necator}, \emph{Nectria}, \emph{Ochroconis}, \emph{Oesophagostomum}, \emph{Oidiodendron}, \emph{Opisthorchis}, \emph{Pediculus}, \emph{Penicillium}, \emph{Phlebotomus}, \emph{Phoma}, \emph{Pichia}, \emph{Piedraia}, \emph{Pithomyces}, \emph{Pityrosporum}, \emph{Pneumocystis}, \emph{Pseudallescheria}, \emph{Pseudoterranova}, \emph{Pulex}, \emph{Rhizomucor}, \emph{Rhizopus}, \emph{Rhodotorula}, \emph{Saccharomyces}, \emph{Sarcoptes}, \emph{Scolecobasidium}, \emph{Scopulariopsis}, \emph{Scytalidium}, \emph{Spirometra}, \emph{Sporobolomyces}, \emph{Stachybotrys}, \emph{Strongyloides}, \emph{Syngamus}, \emph{Taenia}, \emph{Talaromyces}, \emph{Toxocara}, \emph{Trichinella}, \emph{Trichobilharzia}, \emph{Trichoderma}, \emph{Trichomonas}, \emph{Trichophyton}, \emph{Trichosporon}, \emph{Trichostrongylus}, \emph{Trichuris}, \emph{Tritirachium}, \emph{Trombicula}, \emph{Trypanosoma}, \emph{Tunga}, or \emph{Wuchereria};
\item All other records have \code{prevalence = 2.0} in the \link{microorganisms} data set. \item All other records have \code{prevalence = 2.0} in the \link{microorganisms} data set.
} }

View File

@ -163,7 +163,7 @@ After using \code{\link[=as.sir]{as.sir()}}, you can use the \code{\link[=eucast
\subsection{Machine-Readable Clinical Breakpoints}{ \subsection{Machine-Readable Clinical Breakpoints}{
The repository of this package \href{https://github.com/msberends/AMR/blob/main/data-raw/clinical_breakpoints.txt}{contains a machine-readable version} of all guidelines. This is a CSV file consisting of 18 308 rows and 11 columns. This file is machine-readable, since it contains one row for every unique combination of the test method (MIC or disk diffusion), the antimicrobial drug and the microorganism. \strong{This allows for easy implementation of these rules in laboratory information systems (LIS)}. Note that it only contains interpretation guidelines for humans - interpretation guidelines from CLSI for animals were removed. The repository of this package \href{https://github.com/msberends/AMR/blob/main/data-raw/clinical_breakpoints.txt}{contains a machine-readable version} of all guidelines. This is a CSV file consisting of 18 271 rows and 11 columns. This file is machine-readable, since it contains one row for every unique combination of the test method (MIC or disk diffusion), the antimicrobial drug and the microorganism. \strong{This allows for easy implementation of these rules in laboratory information systems (LIS)}. Note that it only contains interpretation guidelines for humans - interpretation guidelines from CLSI for animals were removed.
} }
\subsection{Other}{ \subsection{Other}{

View File

@ -5,7 +5,7 @@
\alias{clinical_breakpoints} \alias{clinical_breakpoints}
\title{Data Set with Clinical Breakpoints for SIR Interpretation} \title{Data Set with Clinical Breakpoints for SIR Interpretation}
\format{ \format{
A \link[tibble:tibble]{tibble} with 18 308 observations and 11 variables: A \link[tibble:tibble]{tibble} with 18 271 observations and 11 variables:
\itemize{ \itemize{
\item \code{guideline}\cr Name of the guideline \item \code{guideline}\cr Name of the guideline
\item \code{method}\cr Either "DISK" or "MIC" \item \code{method}\cr Either "DISK" or "MIC"

File diff suppressed because one or more lines are too long

View File

@ -46,6 +46,9 @@ These \code{\link[=like]{like()}} and \verb{\%like\%}/\verb{\%unlike\%} function
Using RStudio? The \verb{\%like\%}/\verb{\%unlike\%} functions can also be directly inserted in your code from the Addins menu and can have its own keyboard shortcut like \code{Shift+Ctrl+L} or \code{Shift+Cmd+L} (see menu \code{Tools} > \verb{Modify Keyboard Shortcuts...}). If you keep pressing your shortcut, the inserted text will be iterated over \verb{\%like\%} -> \verb{\%unlike\%} -> \verb{\%like_case\%} -> \verb{\%unlike_case\%}. Using RStudio? The \verb{\%like\%}/\verb{\%unlike\%} functions can also be directly inserted in your code from the Addins menu and can have its own keyboard shortcut like \code{Shift+Ctrl+L} or \code{Shift+Cmd+L} (see menu \code{Tools} > \verb{Modify Keyboard Shortcuts...}). If you keep pressing your shortcut, the inserted text will be iterated over \verb{\%like\%} -> \verb{\%unlike\%} -> \verb{\%like_case\%} -> \verb{\%unlike_case\%}.
} }
\examples{ \examples{
# data.table has a more limited version of \%like\%, so unload it:
try(detach("package:data.table", unload = TRUE), silent = TRUE)
a <- "This is a test" a <- "This is a test"
b <- "TEST" b <- "TEST"
a \%like\% b a \%like\% b

File diff suppressed because one or more lines are too long

View File

@ -3,9 +3,9 @@
\docType{data} \docType{data}
\name{microorganisms} \name{microorganisms}
\alias{microorganisms} \alias{microorganisms}
\title{Data Set with 52 142 Microorganisms} \title{Data Set with 52 151 Microorganisms}
\format{ \format{
A \link[tibble:tibble]{tibble} with 52 142 observations and 22 variables: A \link[tibble:tibble]{tibble} with 52 151 observations and 22 variables:
\itemize{ \itemize{
\item \code{mo}\cr ID of microorganism as used by this package \item \code{mo}\cr ID of microorganism as used by this package
\item \code{fullname}\cr Full name, like \code{"Escherichia coli"}. For the taxonomic ranks genus, species and subspecies, this is the 'pasted' text of genus, species, and subspecies. For all taxonomic ranks higher than genus, this is the name of the taxon. \item \code{fullname}\cr Full name, like \code{"Escherichia coli"}. For the taxonomic ranks genus, species and subspecies, this is the 'pasted' text of genus, species, and subspecies. For all taxonomic ranks higher than genus, this is the name of the taxon.
@ -51,7 +51,7 @@ Included taxonomic data are:
\item All ~36 000 (sub)species from the kingdoms of Archaea and Bacteria \item All ~36 000 (sub)species from the kingdoms of Archaea and Bacteria
\item ~7 900 (sub)species from the kingdom of Fungi. The kingdom of Fungi is a very large taxon with almost 300,000 different (sub)species, of which most are not microbial (but rather macroscopic, like mushrooms). Because of this, not all fungi fit the scope of this package. Only relevant fungi are covered (such as all species of \emph{Aspergillus}, \emph{Candida}, \emph{Cryptococcus}, \emph{Histoplasma}, \emph{Pneumocystis}, \emph{Saccharomyces} and \emph{Trichophyton}). \item ~7 900 (sub)species from the kingdom of Fungi. The kingdom of Fungi is a very large taxon with almost 300,000 different (sub)species, of which most are not microbial (but rather macroscopic, like mushrooms). Because of this, not all fungi fit the scope of this package. Only relevant fungi are covered (such as all species of \emph{Aspergillus}, \emph{Candida}, \emph{Cryptococcus}, \emph{Histoplasma}, \emph{Pneumocystis}, \emph{Saccharomyces} and \emph{Trichophyton}).
\item ~5 100 (sub)species from the kingdom of Protozoa \item ~5 100 (sub)species from the kingdom of Protozoa
\item ~1 400 (sub)species from ~40 other relevant genera from the kingdom of Animalia (such as \emph{Strongyloides} and \emph{Taenia}) \item ~1 400 (sub)species from 43 other relevant genera from the kingdom of Animalia (such as \emph{Strongyloides} and \emph{Taenia})
\item All ~9 800 previously accepted names of all included (sub)species (these were taxonomically renamed) \item All ~9 800 previously accepted names of all included (sub)species (these were taxonomically renamed)
\item The complete taxonomic tree of all included (sub)species: from kingdom to subspecies \item The complete taxonomic tree of all included (sub)species: from kingdom to subspecies
\item The identifier of the parent taxons \item The identifier of the parent taxons
@ -61,12 +61,12 @@ Included taxonomic data are:
For convenience, some entries were added manually: For convenience, some entries were added manually:
\itemize{ \itemize{
\item ~1 500 entries for the city-like serovars of \emph{Salmonellae} \item ~1 500 entries of \emph{Salmonella}, such as the city-like serovars and groups A to H
\item 11 entries of \emph{Streptococcus} (beta-haemolytic: groups A, B, C, D, F, G, H, K and unspecified; other: viridans, milleri) \item 15 entries of \emph{Streptococcus}, such as the beta-haemolytic groups A to K, viridans, and milleri
\item 2 entries of \emph{Staphylococcus} (coagulase-negative (CoNS) and coagulase-positive (CoPS)) \item 2 entries of \emph{Staphylococcus} (coagulase-negative (CoNS) and coagulase-positive (CoPS))
\item 1 entry of \emph{Blastocystis} (\emph{B. hominis}), although it officially does not exist (Noel \emph{et al.} 2005, PMID 15634993) \item 1 entry of \emph{Blastocystis} (\emph{B. hominis}), although it officially does not exist (Noel \emph{et al.} 2005, PMID 15634993)
\item 1 entry of \emph{Moraxella} (\emph{M. catarrhalis}), which was formally named \emph{Branhamella catarrhalis} (Catlin, 1970) though this change was never accepted within the field of clinical microbiology \item 1 entry of \emph{Moraxella} (\emph{M. catarrhalis}), which was formally named \emph{Branhamella catarrhalis} (Catlin, 1970) though this change was never accepted within the field of clinical microbiology
\item 6 other 'undefined' entries (unknown, unknown Gram negatives, unknown Gram positives, unknown yeast, unknown fungus, and unknown anaerobic bacteria) \item 8 other 'undefined' entries (unknown, unknown Gram-negatives, unknown Gram-positives, unknown yeast, unknown fungus, and unknown anaerobic Gram-pos/Gram-neg bacteria)
} }
The syntax used to transform the original data to a cleansed \R format, can be found here: \url{https://github.com/msberends/AMR/blob/main/data-raw/reproduction_of_microorganisms.R}. The syntax used to transform the original data to a cleansed \R format, can be found here: \url{https://github.com/msberends/AMR/blob/main/data-raw/reproduction_of_microorganisms.R}.

View File

@ -3,9 +3,9 @@
\docType{data} \docType{data}
\name{microorganisms.codes} \name{microorganisms.codes}
\alias{microorganisms.codes} \alias{microorganisms.codes}
\title{Data Set with 5 910 Common Microorganism Codes} \title{Data Set with 5 754 Common Microorganism Codes}
\format{ \format{
A \link[tibble:tibble]{tibble} with 5 910 observations and 2 variables: A \link[tibble:tibble]{tibble} with 5 754 observations and 2 variables:
\itemize{ \itemize{
\item \code{code}\cr Commonly used code of a microorganism \item \code{code}\cr Commonly used code of a microorganism
\item \code{mo}\cr ID of the microorganism in the \link{microorganisms} data set \item \code{mo}\cr ID of the microorganism in the \link{microorganisms} data set

View File

@ -48,7 +48,7 @@ Furthermore,
\item Any genus present in the \strong{established} list also has \code{prevalence = 1.0} in the \link{microorganisms} data set; \item Any genus present in the \strong{established} list also has \code{prevalence = 1.0} in the \link{microorganisms} data set;
\item Any other genus present in the \strong{putative} list has \code{prevalence = 1.25} in the \link{microorganisms} data set; \item Any other genus present in the \strong{putative} list has \code{prevalence = 1.25} in the \link{microorganisms} data set;
\item Any other species or subspecies of which the genus is present in the two aforementioned groups, has \code{prevalence = 1.5} in the \link{microorganisms} data set; \item Any other species or subspecies of which the genus is present in the two aforementioned groups, has \code{prevalence = 1.5} in the \link{microorganisms} data set;
\item Any \emph{non-bacterial} genus, species or subspecies of which the genus is present in the following list, has \code{prevalence = 1.5} in the \link{microorganisms} data set: \emph{Absidia}, \emph{Acanthamoeba}, \emph{Acremonium}, \emph{Aedes}, \emph{Alternaria}, \emph{Amoeba}, \emph{Ancylostoma}, \emph{Angiostrongylus}, \emph{Anisakis}, \emph{Anopheles}, \emph{Apophysomyces}, \emph{Aspergillus}, \emph{Aureobasidium}, \emph{Basidiobolus}, \emph{Beauveria}, \emph{Blastocystis}, \emph{Blastomyces}, \emph{Candida}, \emph{Capillaria}, \emph{Chaetomium}, \emph{Chrysonilia}, \emph{Cladophialophora}, \emph{Cladosporium}, \emph{Conidiobolus}, \emph{Contracaecum}, \emph{Cordylobia}, \emph{Cryptococcus}, \emph{Curvularia}, \emph{Demodex}, \emph{Dermatobia}, \emph{Dientamoeba}, \emph{Diphyllobothrium}, \emph{Dirofilaria}, \emph{Echinostoma}, \emph{Entamoeba}, \emph{Enterobius}, \emph{Exophiala}, \emph{Exserohilum}, \emph{Fasciola}, \emph{Fonsecaea}, \emph{Fusarium}, \emph{Giardia}, \emph{Haloarcula}, \emph{Halobacterium}, \emph{Halococcus}, \emph{Hendersonula}, \emph{Heterophyes}, \emph{Histomonas}, \emph{Histoplasma}, \emph{Hymenolepis}, \emph{Hypomyces}, \emph{Hysterothylacium}, \emph{Leishmania}, \emph{Malassezia}, \emph{Malbranchea}, \emph{Metagonimus}, \emph{Meyerozyma}, \emph{Microsporidium}, \emph{Microsporum}, \emph{Mortierella}, \emph{Mucor}, \emph{Mycocentrospora}, \emph{Necator}, \emph{Nectria}, \emph{Ochroconis}, \emph{Oesophagostomum}, \emph{Oidiodendron}, \emph{Opisthorchis}, \emph{Pediculus}, \emph{Phlebotomus}, \emph{Phoma}, \emph{Pichia}, \emph{Piedraia}, \emph{Pithomyces}, \emph{Pityrosporum}, \emph{Pneumocystis}, \emph{Pseudallescheria}, \emph{Pseudoterranova}, \emph{Pulex}, \emph{Rhizomucor}, \emph{Rhizopus}, \emph{Rhodotorula}, \emph{Saccharomyces}, \emph{Sarcoptes}, \emph{Scolecobasidium}, \emph{Scopulariopsis}, \emph{Scytalidium}, \emph{Spirometra}, \emph{Sporobolomyces}, \emph{Stachybotrys}, \emph{Strongyloides}, \emph{Syngamus}, \emph{Taenia}, \emph{Toxocara}, \emph{Trichinella}, \emph{Trichobilharzia}, \emph{Trichoderma}, \emph{Trichomonas}, \emph{Trichophyton}, \emph{Trichosporon}, \emph{Trichostrongylus}, \emph{Trichuris}, \emph{Tritirachium}, \emph{Trombicula}, \emph{Trypanosoma}, \emph{Tunga}, or \emph{Wuchereria}; \item Any \emph{non-bacterial} genus, species or subspecies of which the genus is present in the following list, has \code{prevalence = 1.5} in the \link{microorganisms} data set: \emph{Absidia}, \emph{Acanthamoeba}, \emph{Acremonium}, \emph{Aedes}, \emph{Alternaria}, \emph{Amoeba}, \emph{Ancylostoma}, \emph{Angiostrongylus}, \emph{Anisakis}, \emph{Anopheles}, \emph{Apophysomyces}, \emph{Aspergillus}, \emph{Aureobasidium}, \emph{Basidiobolus}, \emph{Beauveria}, \emph{Blastocystis}, \emph{Blastomyces}, \emph{Candida}, \emph{Capillaria}, \emph{Chaetomium}, \emph{Chrysonilia}, \emph{Cladophialophora}, \emph{Cladosporium}, \emph{Conidiobolus}, \emph{Contracaecum}, \emph{Cordylobia}, \emph{Cryptococcus}, \emph{Curvularia}, \emph{Demodex}, \emph{Dermatobia}, \emph{Dientamoeba}, \emph{Diphyllobothrium}, \emph{Dirofilaria}, \emph{Echinostoma}, \emph{Entamoeba}, \emph{Enterobius}, \emph{Exophiala}, \emph{Exserohilum}, \emph{Fasciola}, \emph{Fonsecaea}, \emph{Fusarium}, \emph{Giardia}, \emph{Haloarcula}, \emph{Halobacterium}, \emph{Halococcus}, \emph{Hendersonula}, \emph{Heterophyes}, \emph{Histomonas}, \emph{Histoplasma}, \emph{Hymenolepis}, \emph{Hypomyces}, \emph{Hysterothylacium}, \emph{Leishmania}, \emph{Malassezia}, \emph{Malbranchea}, \emph{Metagonimus}, \emph{Meyerozyma}, \emph{Microsporidium}, \emph{Microsporum}, \emph{Mortierella}, \emph{Mucor}, \emph{Mycocentrospora}, \emph{Necator}, \emph{Nectria}, \emph{Ochroconis}, \emph{Oesophagostomum}, \emph{Oidiodendron}, \emph{Opisthorchis}, \emph{Pediculus}, \emph{Penicillium}, \emph{Phlebotomus}, \emph{Phoma}, \emph{Pichia}, \emph{Piedraia}, \emph{Pithomyces}, \emph{Pityrosporum}, \emph{Pneumocystis}, \emph{Pseudallescheria}, \emph{Pseudoterranova}, \emph{Pulex}, \emph{Rhizomucor}, \emph{Rhizopus}, \emph{Rhodotorula}, \emph{Saccharomyces}, \emph{Sarcoptes}, \emph{Scolecobasidium}, \emph{Scopulariopsis}, \emph{Scytalidium}, \emph{Spirometra}, \emph{Sporobolomyces}, \emph{Stachybotrys}, \emph{Strongyloides}, \emph{Syngamus}, \emph{Taenia}, \emph{Talaromyces}, \emph{Toxocara}, \emph{Trichinella}, \emph{Trichobilharzia}, \emph{Trichoderma}, \emph{Trichomonas}, \emph{Trichophyton}, \emph{Trichosporon}, \emph{Trichostrongylus}, \emph{Trichuris}, \emph{Tritirachium}, \emph{Trombicula}, \emph{Trypanosoma}, \emph{Tunga}, or \emph{Wuchereria};
\item All other records have \code{prevalence = 2.0} in the \link{microorganisms} data set. \item All other records have \code{prevalence = 2.0} in the \link{microorganisms} data set.
} }

View File

@ -52,7 +52,7 @@ $(document).ready(function() {
// add doctoral titles to authors // add doctoral titles to authors
function doct_tit(x) { function doct_tit(x) {
if (typeof(x) != "undefined") { if (typeof(x) != "undefined") {
x = x.replace(/Author, maintainer/g, "Principle maintainer"); x = x.replace(/Author, maintainer/g, "Principal maintainer");
x = x.replace(/Author, contributor/g, "Contributing maintainer"); x = x.replace(/Author, contributor/g, "Contributing maintainer");
x = x.replace(/Thesis advisor/g, "(former) Doctoral advisor"); x = x.replace(/Thesis advisor/g, "(former) Doctoral advisor");
// contributors // contributors

View File

@ -247,60 +247,79 @@ our_data_1st[all(betalactams() == "R"), ]
## Generate antibiograms ## Generate antibiograms
This package comes with `antibiogram()`, a function that automatically generates traditional, combined, syndromic, and even weighted-incidence syndromic combination antibiograms (WISCA). For R Markdown (such as this page) it automatically prints in the right table format. Since AMR v2.0 (March 2023), it is very easy to create different types of antibiograms, with support for 20 different languages.
Below are some suggestions for how to generate the different antibiograms: There are four antibiogram types, as proposed by Klinker *et al.* (2021, [DOI 10.1177/20499361211011373](https://doi.org/10.1177/20499361211011373)), and they are all supported by the new `antibiogram()` function:
1. **Traditional Antibiogram (TA)** e.g, for the susceptibility of *Pseudomonas aeruginosa* to piperacillin/tazobactam (TZP)
2. **Combination Antibiogram (CA)** e.g, for the sdditional susceptibility of *Pseudomonas aeruginosa* to TZP + tobramycin versus TZP alone
3. **Syndromic Antibiogram (SA)** e.g, for the susceptibility of *Pseudomonas aeruginosa* to TZP among respiratory specimens (obtained among ICU patients only)
4. **Weighted-Incidence Syndromic Combination Antibiogram (WISCA)** e.g, for the susceptibility of *Pseudomonas aeruginosa* to TZP among respiratory specimens (obtained among ICU patients only) for male patients age >=65 years with heart failure
In this section, we show how to use the `antibiogram()` function to create any of the above antibiogram types. For starters, this is what the included `example_isolates` data set looks like:
```{r} ```{r}
# traditional: example_isolates
antibiogram(our_data_1st)
antibiogram(our_data_1st,
ab_transform = "name"
)
antibiogram(our_data_1st,
ab_transform = "name",
language = "es"
) # support for 20 languages
``` ```
```{r} ### Traditional Antibiogram
# combined:
antibiogram(our_data_1st, To create a traditional antibiogram, simply state which antibiotics should be used. The `antibiotics` argument in the `antibiogram()` function supports any (combination) of the previously mentioned antibiotic class selectors:
antibiotics = c("AMC", "AMC+CIP", "AMC+GEN")
) ```{r trad}
antibiogram(example_isolates,
antibiotics = c(aminoglycosides(), carbapenems()))
``` ```
```{r} Notice that the `antibiogram()` function automatically prints in the right format when using Quarto or R Markdown (such as this page), and even applies italics for taxonomic names (by using `italicise_taxonomy()` internally).
# for a syndromic antibiogram, we must fake some clinical conditions:
our_data_1st$condition <- sample(c("Cardial", "Respiratory", "Rheumatic"),
size = nrow(our_data_1st),
replace = TRUE
)
# syndromic: It also uses the language of your OS if this is either `r AMR:::vector_or(vapply(FUN.VALUE = character(1), AMR:::LANGUAGES_SUPPORTED_NAMES, function(x) x$exonym), quotes = FALSE, sort = FALSE)`. In this next example, we force the language to be Spanish using the `language` argument:
antibiogram(our_data_1st,
syndromic_group = "condition" ```{r trad2}
) antibiogram(example_isolates,
antibiogram(our_data_1st, mo_transform = "gramstain",
# you can use AB selectors here as well: antibiotics = aminoglycosides(),
antibiotics = c(penicillins(), aminoglycosides()), ab_transform = "name",
syndromic_group = "condition", language = "es")
mo_transform = "gramstain"
)
``` ```
```{r} ### Combined Antibiogram
# WISCA:
# (we lack some details, but it could contain a filter on e.g. >65 year-old males) To create a combined antibiogram, use antibiotic codes or names with a plus `+` character like this:
wisca <- antibiogram(our_data_1st,
antibiotics = c("AMC", "AMC+CIP", "AMC+GEN"), ```{r comb}
syndromic_group = "condition", antibiogram(example_isolates,
mo_transform = "gramstain" antibiotics = c("TZP", "TZP+TOB", "TZP+GEN"))
) ```
### Syndromic Antibiogram
To create a syndromic antibiogram, the `syndromic_group` argument must be used. This can be any column in the data, or e.g. an `ifelse()` with calculations based on certain columns:
```{r synd}
antibiogram(example_isolates,
antibiotics = c(aminoglycosides(), carbapenems()),
syndromic_group = "ward")
```
### Weighted-Incidence Syndromic Combination Antibiogram (WISCA)
To create a WISCA, you must state combination therapy in the `antibiotics` argument (similar to the Combination Antibiogram), define a syndromic group with the `syndromic_group` argument (similar to the Syndromic Antibiogram) in which cases are predefined based on clinical or demographic characteristics (e.g., endocarditis in 75+ females). This next example is a simplification without clinical characteristics, but just gives an idea of how a WISCA can be created:
```{r wisca}
wisca <- antibiogram(example_isolates,
antibiotics = c("AMC", "AMC+CIP", "TZP", "TZP+TOB"),
mo_transform = "gramstain",
minimum = 10, # this should be >= 30, but now just as example
syndromic_group = ifelse(example_isolates$age >= 65 &
example_isolates$gender == "M",
"WISCA Group 1", "WISCA Group 2"))
wisca wisca
``` ```
Antibiograms can be plotted using `autoplot()` from the `ggplot2` packages, since this package provides an extension to that function: ### Plotting antibiograms
Antibiograms can be plotted using `autoplot()` from the `ggplot2` packages, since this `AMR` package provides an extension to that function:
```{r} ```{r}
autoplot(wisca) autoplot(wisca)