diff --git a/DESCRIPTION b/DESCRIPTION index 08a4e372..10780e25 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,5 +1,5 @@ Package: AMR -Version: 1.8.1.9005 +Version: 1.8.1.9006 Date: 2022-05-10 Title: Antimicrobial Resistance Data Analysis Description: Functions to simplify and standardise antimicrobial resistance (AMR) diff --git a/NEWS.md b/NEWS.md index 517d7ee4..daf36910 100755 --- a/NEWS.md +++ b/NEWS.md @@ -1,6 +1,9 @@ -# `AMR` 1.8.1.9005 +# `AMR` 1.8.1.9006 ## Last updated: 10 May 2022 +### New +* EUCAST 2022 and CLSI 2022 guidelines have been added for `as.rsi()`. EUCAST 2022 is now the new default guideline for all MIC and disks diffusion interpretations. + ### Changed * Fix for `as.rsi()` on certain EUCAST breakpoints for MIC values * Removed `as.integer()` for MIC values, since MIC are not integer values and running `table()` on MIC values consequently failed for not being able to retrieve the level position (as that's how normally `as.integer()` on `factor`s work) diff --git a/R/plot.R b/R/plot.R index d8380daa..2c82740c 100644 --- a/R/plot.R +++ b/R/plot.R @@ -79,7 +79,7 @@ plot.mic <- function(x, mo = NULL, ab = NULL, guideline = "EUCAST", - main = paste("MIC values of", deparse(substitute(x))), + main = deparse(substitute(x)), ylab = "Frequency", xlab = "Minimum Inhibitory Concentration (mg/L)", colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"), @@ -166,7 +166,7 @@ barplot.mic <- function(height, mo = NULL, ab = NULL, guideline = "EUCAST", - main = paste("MIC values of", deparse(substitute(height))), + main = deparse(substitute(height)), ylab = "Frequency", xlab = "Minimum Inhibitory Concentration (mg/L)", colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"), @@ -299,7 +299,7 @@ fortify.mic <- function(object, ...) { #' @importFrom graphics barplot axis mtext legend #' @rdname plot plot.disk <- function(x, - main = paste("Disk zones of", deparse(substitute(x))), + main = deparse(substitute(x)), ylab = "Frequency", xlab = "Disk diffusion diameter (mm)", mo = NULL, @@ -386,7 +386,7 @@ plot.disk <- function(x, #' @export #' @noRd barplot.disk <- function(height, - main = paste("Disk zones of", deparse(substitute(height))), + main = deparse(substitute(height)), ylab = "Frequency", xlab = "Disk diffusion diameter (mm)", mo = NULL, @@ -525,7 +525,7 @@ fortify.disk <- function(object, ...) { plot.rsi <- function(x, ylab = "Percentage", xlab = "Antimicrobial Interpretation", - main = paste("Resistance Overview of", deparse(substitute(x))), + main = deparse(substitute(x)), ...) { meet_criteria(ylab, allow_class = "character", has_length = 1) meet_criteria(xlab, allow_class = "character", has_length = 1) @@ -576,7 +576,7 @@ plot.rsi <- function(x, #' @export #' @noRd barplot.rsi <- function(height, - main = paste("Resistance Overview of", deparse(substitute(height))), + main = deparse(substitute(height)), xlab = "Antimicrobial Interpretation", ylab = "Frequency", colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"), @@ -738,7 +738,11 @@ plot_colours_subtitle_guideline <- function(x, mo, ab, guideline, colours_RSI, f ab_name(ab, language = NULL, tolower = TRUE), " in ", moname) guideline_txt <- "" } else { - guideline_txt <- paste0("(", guideline, ")") + guideline_txt <- guideline + if (isTRUE(list(...)$uti)) { + guideline_txt <- paste("UTIs,", guideline_txt) + } + guideline_txt <- paste0("(", guideline_txt, ")") } sub <- bquote(.(abname)~"-"~italic(.(moname))~.(guideline_txt)) } else { diff --git a/data-raw/AMR_latest.tar.gz b/data-raw/AMR_latest.tar.gz index 6f50b74a..78a886d2 100644 Binary files a/data-raw/AMR_latest.tar.gz and b/data-raw/AMR_latest.tar.gz differ diff --git a/data-raw/reproduction_of_rsi_translation.R b/data-raw/reproduction_of_rsi_translation.R index e4695a7f..3ad92c0d 100644 --- a/data-raw/reproduction_of_rsi_translation.R +++ b/data-raw/reproduction_of_rsi_translation.R @@ -24,6 +24,7 @@ # ==================================================================== # # This script runs in under a minute and renews all guidelines of CLSI and EUCAST! +# Run it with source("data-raw/reproduction_of_rsi_translation.R") library(dplyr) library(readr) @@ -32,9 +33,9 @@ library(AMR) # Install the WHONET software on Windows (http://www.whonet.org/software.html), # and copy the folder C:\WHONET\Codes to data-raw/WHONET/Codes -DRGLST <- readr::read_tsv("data-raw/WHONET/Codes/DRGLST.txt", na = c("", "NA", "-")) -DRGLST1 <- readr::read_tsv("data-raw/WHONET/Codes/DRGLST1.txt", na = c("", "NA", "-")) -ORGLIST <- readr::read_tsv("data-raw/WHONET/Codes/ORGLIST.txt", na = c("", "NA", "-")) +DRGLST <- read_tsv("data-raw/WHONET/Codes/DRGLST.txt", na = c("", "NA", "-"), show_col_types = FALSE) +DRGLST1 <- read_tsv("data-raw/WHONET/Codes/DRGLST1.txt", na = c("", "NA", "-"), show_col_types = FALSE) +ORGLIST <- read_tsv("data-raw/WHONET/Codes/ORGLIST.txt", na = c("", "NA", "-"), show_col_types = FALSE) # create data set for generic rules (i.e., AB-specific but not MO-specific) rsi_generic <- DRGLST %>% @@ -134,11 +135,17 @@ rsi_translation[which(rsi_translation$breakpoint_R == 1025), "breakpoint_R"] <- # this will make an MIC of 12 I, which should be R, so: eucast_mics <- which(rsi_translation$guideline %like% "EUCAST" & rsi_translation$method == "MIC" & - log2(as.double(rsi_translation$breakpoint_R)) - log2(as.double(rsi_translation$breakpoint_S)) != 0) -rsi_translation[eucast_mics, "breakpoint_R"] <- 2 ^ (log2(as.double(rsi_translation[eucast_mics, "breakpoint_R", drop = TRUE])) - 1) + log2(as.double(rsi_translation$breakpoint_R)) - log2(as.double(rsi_translation$breakpoint_S)) != 0 & + !is.na(rsi_translation$breakpoint_R)) +old_R <- rsi_translation[eucast_mics, "breakpoint_R", drop = TRUE] +old_S <- rsi_translation[eucast_mics, "breakpoint_S", drop = TRUE] +new_R <- 2 ^ (log2(old_R) - 1) +new_R[new_R < old_S | is.na(as.mic(new_R))] <- old_S[new_R < old_S | is.na(as.mic(new_R))] +rsi_translation[eucast_mics, "breakpoint_R"] <- new_R eucast_disks <- which(rsi_translation$guideline %like% "EUCAST" & - rsi_translation$method == "DISK" & - rsi_translation$breakpoint_S - rsi_translation$breakpoint_R != 0) + rsi_translation$method == "DISK" & + rsi_translation$breakpoint_S - rsi_translation$breakpoint_R != 0 & + !is.na(rsi_translation$breakpoint_R)) rsi_translation[eucast_disks, "breakpoint_R"] <- rsi_translation[eucast_disks, "breakpoint_R", drop = TRUE] + 1 # Greek symbols and EM dash symbols are not allowed by CRAN, so replace them with ASCII: diff --git a/data-raw/rsi.md5 b/data-raw/rsi.md5 index 8dce952c..c3efb552 100644 --- a/data-raw/rsi.md5 +++ b/data-raw/rsi.md5 @@ -1 +1 @@ -657a743283954b40bb68fd3b965462a2 +3d85846458b19df96198695470e87ed6 diff --git a/data-raw/rsi_translation.dta b/data-raw/rsi_translation.dta index 532a1e41..62e9c61e 100644 Binary files a/data-raw/rsi_translation.dta and b/data-raw/rsi_translation.dta differ diff --git a/data-raw/rsi_translation.rds b/data-raw/rsi_translation.rds index e2970acf..341069b5 100644 Binary files a/data-raw/rsi_translation.rds and b/data-raw/rsi_translation.rds differ diff --git a/data-raw/rsi_translation.sas b/data-raw/rsi_translation.sas index 6c91ff20..695a9269 100644 Binary files a/data-raw/rsi_translation.sas and b/data-raw/rsi_translation.sas differ diff --git a/data-raw/rsi_translation.sav b/data-raw/rsi_translation.sav index 16d7fa45..27b44922 100644 Binary files a/data-raw/rsi_translation.sav and b/data-raw/rsi_translation.sav differ diff --git a/data-raw/rsi_translation.txt b/data-raw/rsi_translation.txt index 4afd62ce..d44a51e7 100644 --- a/data-raw/rsi_translation.txt +++ b/data-raw/rsi_translation.txt @@ -1,4 +1,1066 @@ "guideline" "method" "site" "mo" "rank_index" "ab" "ref_tbl" "disk_dose" "breakpoint_S" "breakpoint_R" "uti" +"EUCAST 2022" "MIC" "Aspergillus fumigatus" 2 "Amphotericin B" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Aspergillus niger" 2 "Amphotericin B" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Candida" 3 "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "Candida albicans" 2 "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "Candida dubliniensis" 2 "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "Candida krusei" 2 "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "Candida parapsilosis" 2 "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "Candida tropicalis" 2 "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "Cryptococcus neoformans" 2 "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "Pichia" 3 "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20-10" 19 19 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20-10" 16 16 TRUE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2022" "DISK" "Burkholderia pseudomallei" 2 "Amoxicillin/clavulanic acid" "B. pseudomallei" "20ug/10ug" 50 22 FALSE +"EUCAST 2022" "MIC" "Burkholderia pseudomallei" 2 "Amoxicillin/clavulanic acid" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2022" "DISK" "IV" "Haemophilus" 3 "Amoxicillin/clavulanic acid" "H. influenzae" "2-1" 15 15 FALSE +"EUCAST 2022" "DISK" "Oral" "Haemophilus" 3 "Amoxicillin/clavulanic acid" "H. influenzae" "2-1" 50 15 FALSE +"EUCAST 2022" "MIC" "IV" "Haemophilus" 3 "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "MIC" "Oral" "Haemophilus" 3 "Amoxicillin/clavulanic acid" "H. influenzae" 0.001 2 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" "2-1" 19 19 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE +"EUCAST 2022" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2022" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 18 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 18 TRUE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." "30" 19 19 FALSE +"EUCAST 2022" "DISK" "UTI" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." "30" 19 19 TRUE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." 8 8 FALSE +"EUCAST 2022" "MIC" "UTI" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." 8 8 TRUE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 15 15 FALSE +"EUCAST 2022" "DISK" "UTI" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 15 15 TRUE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Amikacin" "Pseudo" 16 16 FALSE +"EUCAST 2022" "MIC" "UTI" "Pseudomonas" 3 "Amikacin" "Pseudo" 16 16 TRUE +"EUCAST 2022" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30" 15 15 FALSE +"EUCAST 2022" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 16 16 FALSE +"EUCAST 2022" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30" 15 15 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 16 16 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Amikacin" "Staphs" "30" 18 18 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Amikacin" "Staphs" 8 8 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Amikacin" "PK/PD" 1 1 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ampicillin" "Enterobacteriaceae" "10" 14 14 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "Aerococcus" 3 "Ampicillin" "Aerococcus" 26 26 FALSE +"EUCAST 2022" "MIC" "Aerococcus" 3 "Ampicillin" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Ampicillin" "Enterococcus" "2" 10 8 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Haemophilus" 3 "Ampicillin" "H. influenzae" "2" 18 18 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Haemophilus" 3 "Ampicillin" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "IV" "Listeria monocytogenes" 2 "Ampicillin" "L. monocytogenes" "2" 16 16 FALSE +"EUCAST 2022" "MIC" "IV" "Listeria monocytogenes" 2 "Ampicillin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2022" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ampicillin" "S. pneumoniae" "2" 22 19 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ampicillin" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Ampicillin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2" 21 15 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2022" "MIC" "Oral" "Helicobacter pylori" 2 "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Haemophilus" 3 "Amoxicillin" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "MIC" "Oral" "Haemophilus" 3 "Amoxicillin" "H. influenzae" 0.001 2 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Amoxicillin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Amoxicillin" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2022" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 4 4 FALSE +"EUCAST 2022" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 26 21 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 50 18 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Aztreonam" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Azithromycin" "H. influenzae" 4 4 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Azithromycin" "Kingella" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Azithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Azithromycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Azithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Azithromycin" "Vibrio" "15" 16 16 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Azithromycin" "Vibrio" "15" 16 16 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Azithromycin" "Vibrio" "15" 16 16 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Azithromycin" "Vibrio" "15" 16 16 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Azithromycin" "Vibrio" "15" 16 16 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "MIC" "Mycobacterium tuberculosis" 2 "Bedaquiline" "M. tuberculosis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ceftobiprole" "Enterobacteriaceae" 23 23 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftobiprole" "Staphs" "5" 17 17 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" "10" 22 19 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2022" "DISK" "Aeromonas" 3 "Ceftazidime" "Aeromonas" "10ug" 24 21 FALSE +"EUCAST 2022" "MIC" "Aeromonas" 3 "Ceftazidime" "Aeromonas" 1 4 FALSE +"EUCAST 2022" "DISK" "Burkholderia pseudomallei" 2 "Ceftazidime" "B. pseudomallei" "10ug" 50 18 FALSE +"EUCAST 2022" "MIC" "Burkholderia pseudomallei" 2 "Ceftazidime" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Ceftazidime" "Pseudo" "10" 50 17 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Ceftazidime" "Pseudo" 0.001 8 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Ceftazidime" "Vibrio" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Ceftazidime" "Vibrio" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Ceftazidime" "Vibrio" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Ceftazidime" "Vibrio" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Ceftazidime" "Vibrio" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Cefaclor" "S. pneumoniae" "30" 50 28 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "S. pneumoniae" 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Cefixime" "Enterobacteriaceae" "5" 17 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Cefixime" "H. influenzae" "5" 26 26 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Cefixime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Cefixime" "M. catarrhalis" "5" 21 18 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Cefixime" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Cefadroxil" "Enterobacteriaceae" "30" 12 12 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Chloramphenicol" "Enterobacteriaceae" "30" 17 17 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "Burkholderia pseudomallei" 2 "Chloramphenicol" "B. pseudomallei" "30ug" 50 22 FALSE +"EUCAST 2022" "MIC" "Burkholderia pseudomallei" 2 "Chloramphenicol" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Chloramphenicol" "H. influenzae" "30" 28 28 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Chloramphenicol" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Neisseria meningitidis" 2 "Chloramphenicol" "N. meningitidis" 2 2 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Chloramphenicol" "Staphs" "30" 18 18 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Chloramphenicol" "Strep A, B, C, G" "30" 19 19 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Chloramphenicol" "S. pneumoniae" "30" 21 21 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Chloramphenicol" "S. pneumoniae" 8 8 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ciprofloxacin" "Enterobacteriaceae" "5" 25 22 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ciprofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Acinetobacter spp." "5" 50 21 FALSE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Acinetobacter spp." 0.001 1 FALSE +"EUCAST 2022" "DISK" "Aerococcus" 3 "Ciprofloxacin" "Aerococcus" 21 21 FALSE +"EUCAST 2022" "MIC" "Aerococcus" 3 "Ciprofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2022" "DISK" "Aeromonas" 3 "Ciprofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2022" "MIC" "Aeromonas" 3 "Ciprofloxacin" "Aeromonas" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Bacillus" 3 "Ciprofloxacin" "Bacillus sp." "5ug" 50 23 FALSE +"EUCAST 2022" "MIC" "Bacillus" 3 "Ciprofloxacin" "Bacillus sp." 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "Campylobacter coli" 2 "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE +"EUCAST 2022" "MIC" "Campylobacter coli" 2 "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "Campylobacter jejuni" 2 "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE +"EUCAST 2022" "MIC" "Campylobacter jejuni" 2 "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "Corynebacterium" 3 "Ciprofloxacin" "Corynebacterium spp." "5" 50 25 FALSE +"EUCAST 2022" "MIC" "Corynebacterium" 3 "Ciprofloxacin" "Corynebacterium spp." 0.001 1 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" "5" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" "5" 30 30 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 28 28 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" "5" 31 31 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2022" "MIC" "Prophylaxis" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 50 26 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 50 24 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ciprofloxacin" "Staphs" "5" 50 21 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Ciprofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Ciprofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Ciprofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Ciprofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Ciprofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Bacillus" 3 "Clindamycin" "Bacillus sp." "2ug" 17 17 FALSE +"EUCAST 2022" "MIC" "Bacillus" 3 "Clindamycin" "Bacillus sp." 1 1 FALSE +"EUCAST 2022" "DISK" "Bacteroides" 3 "Clindamycin" "Bacteroides" "2" 10 10 FALSE +"EUCAST 2022" "MIC" "Bacteroides" 3 "Clindamycin" "Bacteroides" 4 4 FALSE +"EUCAST 2022" "DISK" "Corynebacterium" 3 "Clindamycin" "Corynebacterium spp." "2" 20 20 FALSE +"EUCAST 2022" "MIC" "Corynebacterium" 3 "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Cutibacterium acnes" 2 "Clindamycin" "C. acnes" "2" 26 26 FALSE +"EUCAST 2022" "MIC" "Cutibacterium acnes" 2 "Clindamycin" "C. acnes" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Clostridium perfringens" 2 "Clindamycin" "C. perfringens" "2" 19 19 FALSE +"EUCAST 2022" "MIC" "Clostridium perfringens" 2 "Clindamycin" "C. perfringens" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Fusobacterium necrophorum" 2 "Clindamycin" "F. necrophorum" "2" 30 30 FALSE +"EUCAST 2022" "MIC" "Fusobacterium necrophorum" 2 "Clindamycin" "F. necrophorum" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Prevotella" 3 "Clindamycin" "Prevotella" "2" 31 31 FALSE +"EUCAST 2022" "MIC" "Prevotella" 3 "Clindamycin" "Prevotella" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Clindamycin" "Staphs" "2" 22 22 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Clindamycin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Clindamycin" "Strep A, B, C, G" "2" 17 17 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Clindamycin" "S. pneumoniae" "2" 19 19 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Viridans strept" "2" 19 19 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Helicobacter pylori" 2 "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Clarithromycin" "H. influenzae" 32 32 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Clarithromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Clarithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Colistin" "Pseudo" 4 4 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Cefpodoxime" "Enterobacteriaceae" "10" 21 21 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Cefpodoxime" "H. influenzae" "10" 26 26 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Cefpodoxime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "Pneumonia" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE +"EUCAST 2022" "DISK" "Non-pneumonia" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Staphs" "5" 20 17 FALSE +"EUCAST 2022" "MIC" "Pneumonia" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "Non-pneumonia" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "S. pneumoniae" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 25 22 FALSE +"EUCAST 2022" "DISK" "Meningitis" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 25 25 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" "30" 32 32 FALSE +"EUCAST 2022" "DISK" "Meningitis" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" "30" 32 32 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 30 30 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" "30" 24 21 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" 1 2 FALSE +"EUCAST 2022" "MIC" "Neisseria gonorrhoeae" 2 "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Neisseria meningitidis" 2 "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "S. pneumoniae" 0.5 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Viridans strept" "30" 27 27 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Ceftibuten" "Enterobacteriaceae" "30" 23 23 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Ceftibuten" "H. influenzae" "30" 25 25 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Ceftibuten" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Enterobacterales" 5 "Cefotaxime" "Enterobacteriaceae" "5" 20 17 FALSE +"EUCAST 2022" "DISK" "Meningitis" "Enterobacterales" 5 "Cefotaxime" "Enterobacteriaceae" "5" 20 20 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Enterobacterales" 5 "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Enterobacterales" 5 "Cefotaxime" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Haemophilus" 3 "Cefotaxime" "H. influenzae" "5" 27 27 FALSE +"EUCAST 2022" "DISK" "Meningitis" "Haemophilus" 3 "Cefotaxime" "H. influenzae" "5" 27 27 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Haemophilus" 3 "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Haemophilus" 3 "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Cefotaxime" "Kingella" 27 27 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Cefotaxime" "Kingella" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Cefotaxime" "M. catarrhalis" "5" 20 17 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. catarrhalis" 1 2 FALSE +"EUCAST 2022" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "S. pneumoniae" 0.5 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Cefotaxime" "Vibrio" "5" 21 21 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Cefotaxime" "Vibrio" "5" 21 21 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Cefotaxime" "Vibrio" "5" 21 21 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Cefotaxime" "Vibrio" "5" 21 21 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Cefotaxime" "Vibrio" "5" 21 21 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2022" "DISK" "IV" "Enterobacterales" 5 "Cefuroxime" "Enterobacteriaceae" "30" 50 19 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Cefuroxime" "Enterobacteriaceae" "30" 19 19 TRUE +"EUCAST 2022" "MIC" "IV" "Enterobacterales" 5 "Cefuroxime" "Enterobacteriaceae" 0.001 8 FALSE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "IV" "Haemophilus" 3 "Cefuroxime" "H. influenzae" "30" 27 25 FALSE +"EUCAST 2022" "DISK" "Oral" "Haemophilus" 3 "Cefuroxime" "H. influenzae" "30" 50 27 FALSE +"EUCAST 2022" "MIC" "IV" "Haemophilus" 3 "Cefuroxime" "H. influenzae" 1 2 FALSE +"EUCAST 2022" "MIC" "Oral" "Haemophilus" 3 "Cefuroxime" "H. influenzae" 0.001 1 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Cefuroxime" "Kingella" 29 29 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Cefuroxime" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "IV" "Moraxella catarrhalis" 2 "Cefuroxime" "M. catarrhalis" "30" 21 18 FALSE +"EUCAST 2022" "DISK" "Oral" "Moraxella catarrhalis" 2 "Cefuroxime" "M. catarrhalis" "30" 50 21 FALSE +"EUCAST 2022" "MIC" "IV" "Moraxella catarrhalis" 2 "Cefuroxime" "M. catarrhalis" 4 8 FALSE +"EUCAST 2022" "MIC" "Oral" "Moraxella catarrhalis" 2 "Cefuroxime" "M. catarrhalis" 0.001 4 FALSE +"EUCAST 2022" "MIC" "IV" "Streptococcus pneumoniae" 2 "Cefuroxime" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefuroxime" "Viridans strept" "30" 26 26 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ceftazidime/avibactam" "Enterobacteriaceae" 13 13 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ceftazidime/avibactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Pseudo" "10-4" 17 17 FALSE +"EUCAST 2022" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Pseudo" 8 8 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ceftazidime/avibactam" "PK/PD" 8 8 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Cefazolin" "Enterobacteriaceae" "30" 50 20 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Cefazolin" "Enterobacteriaceae" 0.001 4 TRUE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ceftolozane/tazobactam" "Enterobacteriaceae" 22 22 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ceftolozane/tazobactam" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "DISK" "Pneumonia" "Haemophilus" 3 "Ceftolozane/tazobactam" "H. influenzae" "30-10" 23 23 FALSE +"EUCAST 2022" "MIC" "Pneumonia" "Haemophilus" 3 "Ceftolozane/tazobactam" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Pseudo" "30-10" 23 23 FALSE +"EUCAST 2022" "MIC" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Pseudo" 4 4 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ceftolozane/tazobactam" "PK/PD" 4 4 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Dalbavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Dalbavancin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dalbavancin" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Dalbavancin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2022" "MIC" "Escherichia coli" 2 "Delafloxacin" "Enterobacteriaceae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Pneumonia" "Staphylococcus aureus" 2 "Delafloxacin" "Staphs" 0.016 0.016 FALSE +"EUCAST 2022" "MIC" "Skin" "Staphylococcus aureus" 2 "Delafloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Delafloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Delafloxacin" "Strep A, B, C, G" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "Streptococcus anginosus" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "Streptococcus constellatus" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "Streptococcus intermedius" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "Mycobacterium tuberculosis" 2 "Delamanid" "M. tuberculosis" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Doripenem" "Enterobacteriaceae" "30" 24 21 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Doripenem" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Doripenem" "Acinetobacter spp." "10" 50 22 FALSE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Doripenem" "Acinetobacter spp." 0.001 2 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Doripenem" "H. influenzae" "10ug" 23 23 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Doripenem" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Doripenem" "M. catarrhalis" "10ug" 30 30 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Doripenem" "M. catarrhalis" 1 1 FALSE +"EUCAST 2022" "DISK" "UTI" "Pseudomonas" 3 "Doripenem" "Pseudo" "10" 50 22 TRUE +"EUCAST 2022" "MIC" "UTI" "Pseudomonas" 3 "Doripenem" "Pseudo" 0.001 2 TRUE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "S. pneumoniae" 1 1 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2022" "MIC" "Burkholderia pseudomallei" 2 "Doxycycline" "B. pseudomallei" 0.001 2 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Doxycycline" "H. influenzae" 1 2 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Doxycycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "S. pneumoniae" 1 2 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Enterococcus faecium" 2 "Eravacycline" "Enterococcus" "20" 24 24 FALSE +"EUCAST 2022" "MIC" "Enterococcus faecium" 2 "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Enterococcus faecalis" 2 "Eravacycline" "Enterococcus" "20" 22 22 FALSE +"EUCAST 2022" "MIC" "Enterococcus faecalis" 2 "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Escherichia coli" 2 "Eravacycline" "Enterobacteriaceae" "20ug" 17 17 FALSE +"EUCAST 2022" "MIC" "Escherichia coli" 2 "Eravacycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Eravacycline" "Staphs" "20ug" 20 20 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Eravacycline" "Viridans strept" "20ug" 17 17 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Eravacycline" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Bacillus" 3 "Erythromycin" "Bacillus sp." "15ug" 24 24 FALSE +"EUCAST 2022" "MIC" "Bacillus" 3 "Erythromycin" "Bacillus sp." 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Campylobacter coli" 2 "Erythromycin" "C. jejuni, C. coli" "15" 24 24 FALSE +"EUCAST 2022" "MIC" "Campylobacter coli" 2 "Erythromycin" "C. jejuni, C. coli" 8 8 FALSE +"EUCAST 2022" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "C. jejuni, C. coli" "15ug" 20 20 FALSE +"EUCAST 2022" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "C. jejuni, C. coli" 4 4 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Erythromycin" "H. influenzae" 16 16 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Erythromycin" "Kingella" 20 20 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Erythromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Listeria monocytogenes" 2 "Erythromycin" "L. monocytogenes" "15" 25 25 FALSE +"EUCAST 2022" "MIC" "Listeria monocytogenes" 2 "Erythromycin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Erythromycin" "M. catarrhalis" "15" 23 20 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Erythromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Screen" "Staphylococcus" 3 "Erythromycin" "Staphs" "15" 21 21 FALSE +"EUCAST 2022" "MIC" "Screen" "Staphylococcus" 3 "Erythromycin" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Erythromycin" "Strep A, B, C, G" "15" 21 18 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Erythromycin" "S. pneumoniae" "15" 22 19 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Erythromycin" "Vibrio" "15" 12 12 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Erythromycin" "Vibrio" "15" 12 12 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Erythromycin" "Vibrio" "15" 12 12 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Erythromycin" "Vibrio" "15" 12 12 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Erythromycin" "Vibrio" "15" 12 12 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ertapenem" "Enterobacteriaceae" "10" 25 25 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ertapenem" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Ertapenem" "H. influenzae" "10" 23 23 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Ertapenem" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Ertapenem" "M. catarrhalis" "10" 29 29 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Ertapenem" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Cefiderocol" "Enterobacteriaceae" "30" 22 22 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Cefiderocol" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "DISK" "Pseudomonas aeruginosa" 2 "Cefiderocol" "Pseudo" "30" 22 22 FALSE +"EUCAST 2022" "MIC" "Pseudomonas aeruginosa" 2 "Cefiderocol" "Pseudo" 2 2 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Cefepime" "Enterobacteriaceae" "30" 27 24 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2022" "DISK" "Aeromonas" 3 "Cefepime" "Aeromonas" "30ug" 27 24 FALSE +"EUCAST 2022" "MIC" "Aeromonas" 3 "Cefepime" "Aeromonas" 1 4 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Cefepime" "H. influenzae" "30" 28 28 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Cefepime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Cefepime" "M. catarrhalis" "30" 20 20 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Cefepime" "M. catarrhalis" 4 4 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Cefepime" "Pseudo" "30" 50 21 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Cefepime" "Pseudo" 0.001 8 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Cefepime" "S. pneumoniae" 1 2 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Viridans strept" "30" 25 25 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2022" "MIC" "Candida" 3 "Fluconazole" "Candida" 0.001 16 FALSE +"EUCAST 2022" "MIC" "Candida albicans" 2 "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "Candida dubliniensis" 2 "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "Candida parapsilosis" 2 "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "Candida tropicalis" 2 "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Fluconazole" "PK/PD" 2 4 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Fosfomycin" "Enterobacteriaceae" "200" 21 21 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2022" "DISK" "Escherichia coli" 2 "Fosfomycin" "Enterobacteriaceae" 24 24 FALSE +"EUCAST 2022" "DISK" "UTI" "Escherichia coli" 2 "Fosfomycin" "Enterobacteriaceae" 24 24 TRUE +"EUCAST 2022" "MIC" "UTI" "Escherichia coli" 2 "Fosfomycin" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2022" "DISK" "Screen" "Enterobacterales" 5 "Cefoxitin" "Enterobacteriaceae" "30" 19 19 FALSE +"EUCAST 2022" "DISK" "Screen" "Staphylococcus aureus" 2 "Cefoxitin" "Staphs" "30" 22 22 FALSE +"EUCAST 2022" "DISK" "Screen" "Coagulase-negative Staphylococcus (CoNS)" 2 "Cefoxitin" "Staphs" "30" 22 22 FALSE +"EUCAST 2022" "DISK" "Screen" "Staphylococcus epidermidis" 2 "Cefoxitin" "Staphs" "30" 27 27 FALSE +"EUCAST 2022" "DISK" "Screen" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Staphs" "30" 27 27 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 17 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 17 TRUE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 2 TRUE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." "10" 17 17 FALSE +"EUCAST 2022" "DISK" "UTI" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." "10" 17 17 TRUE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2022" "MIC" "UTI" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." 4 4 TRUE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2022" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2022" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Imipenem/relebactam" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Imipenem/relebactam" "Acinetobacter spp." "10-25" 24 24 FALSE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Imipenem/relebactam" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2022" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem/relebactam" "Pseudo" "10-25" 22 22 FALSE +"EUCAST 2022" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem/relebactam" "Pseudo" 2 2 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Imipenem/relebactam" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Imipenem/relebactam" "PK/PD" 2 2 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" "10" 22 19 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Imipenem" "Acinetobacter spp." "10" 24 21 FALSE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Imipenem" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2022" "DISK" "Bacillus" 3 "Imipenem" "Bacillus sp." "10ug" 30 30 FALSE +"EUCAST 2022" "MIC" "Bacillus" 3 "Imipenem" "Bacillus sp." 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Burkholderia pseudomallei" 2 "Imipenem" "B. pseudomallei" "10ug" 29 29 FALSE +"EUCAST 2022" "MIC" "Burkholderia pseudomallei" 2 "Imipenem" "B. pseudomallei" 2 2 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Imipenem" "Enterococcus" "10" 50 21 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Imipenem" "Enterococcus" 0.001 4 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Imipenem" "H. influenzae" "10" 20 20 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Imipenem" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "DISK" "Morganella" 3 "Imipenem" "Enterobacteriaceae" "10" 50 19 FALSE +"EUCAST 2022" "MIC" "Morganella" 3 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2022" "DISK" "Morganella morganii" 2 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE +"EUCAST 2022" "MIC" "Morganella morganii" 2 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Imipenem" "M. catarrhalis" "10" 29 29 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Imipenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2022" "DISK" "Proteus" 3 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE +"EUCAST 2022" "MIC" "Proteus" 3 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2022" "DISK" "Providencia" 3 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE +"EUCAST 2022" "MIC" "Providencia" 3 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Imipenem" "Pseudo" "10" 50 20 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Imipenem" "Pseudo" 0.001 4 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2022" "MIC" "Aspergillus flavus" 2 "Isavuconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2022" "MIC" "Aspergillus fumigatus" 2 "Isavuconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2022" "MIC" "Aspergillus nidulans" 2 "Isavuconazole" "Aspergillus" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Aspergillus terreus" 2 "Isavuconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Aspergillus flavus" 2 "Itraconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Aspergillus fumigatus" 2 "Itraconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Aspergillus nidulans" 2 "Itraconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Aspergillus terreus" 2 "Itraconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Candida dubliniensis" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Candida parapsilosis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Candida tropicalis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Kanamycin" "Staphs" 8 8 FALSE +"EUCAST 2022" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Kanamycin" "Staphs" 22 22 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Kanamycin" "Staphs" "30" 18 18 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" "30" 14 14 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Lefamulin" "Staphs" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Lefamulin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Lefamulin" "S. pneumoniae" "5ug" 12 12 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Lefamulin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Bacillus" 3 "Linezolid" "Bacillus sp." "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "Bacillus" 3 "Linezolid" "Bacillus sp." 2 2 FALSE +"EUCAST 2022" "DISK" "Corynebacterium" 3 "Linezolid" "Corynebacterium spp." "10" 25 25 FALSE +"EUCAST 2022" "MIC" "Corynebacterium" 3 "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Linezolid" "Enterococcus" "10" 20 20 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Linezolid" "Staphs" "10" 21 21 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Linezolid" "Strep A, B, C, G" "10" 19 19 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Linezolid" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Linezolid" "S. pneumoniae" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Linezolid" "PK/PD" 2 2 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Levofloxacin" "Enterobacteriaceae" "5" 23 19 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Levofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Levofloxacin" "Acinetobacter spp." "5" 23 20 FALSE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Levofloxacin" "Acinetobacter spp." 0.5 1 FALSE +"EUCAST 2022" "MIC" "Aerococcus" 3 "Levofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2022" "DISK" "Aeromonas" 3 "Levofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2022" "MIC" "Aeromonas" 3 "Levofloxacin" "Aeromonas" 0.5 1 FALSE +"EUCAST 2022" "DISK" "Bacillus" 3 "Levofloxacin" "Bacillus sp." "5ug" 50 23 FALSE +"EUCAST 2022" "MIC" "Bacillus" 3 "Levofloxacin" "Bacillus sp." 0.001 1 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" "5" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2022" "MIC" "Helicobacter pylori" 2 "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Levofloxacin" "H. influenzae" "5" 30 30 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Levofloxacin" "Kingella" 28 28 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Levofloxacin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" "5" 29 29 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 50 18 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 0.001 2 FALSE +"EUCAST 2022" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 50 24 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Levofloxacin" "Staphs" "5" 50 22 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" "5" 50 17 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" 0.001 2 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Levofloxacin" "S. pneumoniae" "5" 50 16 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Levofloxacin" "S. pneumoniae" 0.001 2 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Levofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Levofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Levofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Levofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Levofloxacin" "Vibrio" "5" 23 23 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Levofloxacin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "UTI" "Citrobacter" 3 "Mecillinam" "Enterobacteriaceae" "10" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Citrobacter" 3 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "Enterobacter" 3 "Mecillinam" "Enterobacteriaceae" "10" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacter" 3 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "Escherichia coli" 2 "Mecillinam" "Enterobacteriaceae" "10" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Escherichia coli" 2 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "Klebsiella" 3 "Mecillinam" "Enterobacteriaceae" "10" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Klebsiella" 3 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "Proteus mirabilis" 2 "Mecillinam" "Enterobacteriaceae" "10" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Proteus mirabilis" 2 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "Raoultella" 3 "Mecillinam" "Enterobacteriaceae" "10" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Raoultella" 3 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "Non-meningitis" "Enterobacterales" 5 "Meropenem" "Enterobacteriaceae" "10" 22 16 FALSE +"EUCAST 2022" "DISK" "Meningitis" "Enterobacterales" 5 "Meropenem" "Enterobacteriaceae" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Enterobacterales" 5 "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Enterobacterales" 5 "Meropenem" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "DISK" "Achromobacter denitrificans" 2 "Meropenem" "A. xylosoxidans" "10ug" 26 20 FALSE +"EUCAST 2022" "MIC" "Achromobacter denitrificans" 2 "Meropenem" "A. xylosoxidans" 1 4 FALSE +"EUCAST 2022" "DISK" "Achromobacter xylosoxidans" 2 "Meropenem" "A. xylosoxidans" "10ug" 26 20 FALSE +"EUCAST 2022" "MIC" "Achromobacter xylosoxidans" 2 "Meropenem" "A. xylosoxidans" 1 4 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Acinetobacter" 3 "Meropenem" "Acinetobacter spp." "10" 21 15 FALSE +"EUCAST 2022" "DISK" "Meningitis" "Acinetobacter" 3 "Meropenem" "Acinetobacter spp." "10" 21 21 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Acinetobacter" 3 "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Acinetobacter" 3 "Meropenem" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2022" "DISK" "Aerococcus" 3 "Meropenem" "Aerococcus" 31 31 FALSE +"EUCAST 2022" "MIC" "Aerococcus" 3 "Meropenem" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Bacillus" 3 "Meropenem" "Bacillus sp." "10ug" 25 25 FALSE +"EUCAST 2022" "MIC" "Bacillus" 3 "Meropenem" "Bacillus sp." 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Bacteroides" 3 "Meropenem" "Bacteroides" "10" 28 28 FALSE +"EUCAST 2022" "MIC" "Bacteroides" 3 "Meropenem" "Bacteroides" 1 1 FALSE +"EUCAST 2022" "DISK" "Burkholderia pseudomallei" 2 "Meropenem" "B. pseudomallei" "10ug" 24 24 FALSE +"EUCAST 2022" "MIC" "Burkholderia pseudomallei" 2 "Meropenem" "B. pseudomallei" 2 2 FALSE +"EUCAST 2022" "DISK" "Cutibacterium acnes" 2 "Meropenem" "C. acnes" "10" 28 28 FALSE +"EUCAST 2022" "MIC" "Cutibacterium acnes" 2 "Meropenem" "C. acnes" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Clostridium perfringens" 2 "Meropenem" "C. perfringens" "10" 25 25 FALSE +"EUCAST 2022" "MIC" "Clostridium perfringens" 2 "Meropenem" "C. perfringens" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Fusobacterium necrophorum" 2 "Meropenem" "F. necrophorum" "10" 35 35 FALSE +"EUCAST 2022" "MIC" "Fusobacterium necrophorum" 2 "Meropenem" "F. necrophorum" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" "10" 20 20 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Meropenem" "Kingella" 30 30 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "Listeria monocytogenes" 2 "Meropenem" "L. monocytogenes" "10" 26 26 FALSE +"EUCAST 2022" "MIC" "Listeria monocytogenes" 2 "Meropenem" "L. monocytogenes" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Meropenem" "M. catarrhalis" "10" 33 33 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Meropenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2022" "MIC" "Neisseria meningitidis" 2 "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Prevotella" 3 "Meropenem" "Prevotella" "10" 34 34 FALSE +"EUCAST 2022" "MIC" "Prevotella" 3 "Meropenem" "Prevotella" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Pseudomonas" 3 "Meropenem" "Pseudo" "10" 24 18 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Pseudomonas" 3 "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Pseudomonas aeruginosa" 2 "Meropenem" "Pseudo" "10ug" 20 14 FALSE +"EUCAST 2022" "DISK" "Meningitis" "Pseudomonas aeruginosa" 2 "Meropenem" "Pseudo" "10ug" 20 20 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Pseudomonas aeruginosa" 2 "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Pseudomonas aeruginosa" 2 "Meropenem" "Pseudo" 2 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Meropenem" "S. pneumoniae" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Meropenem" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Meropenem" "Vibrio" "10" 24 24 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Meropenem" "Vibrio" "10" 24 24 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Meropenem" "Vibrio" "10" 24 24 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Meropenem" "Vibrio" "10" 24 24 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Meropenem" "Vibrio" "10" 24 24 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Meropenem/vaborbactam" "Enterobacteriaceae" "20-10" 20 20 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Meropenem/vaborbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "Pseudomonas aeruginosa" 2 "Meropenem/vaborbactam" "Pseudo" "20-10" 14 14 FALSE +"EUCAST 2022" "MIC" "Pseudomonas aeruginosa" 2 "Meropenem/vaborbactam" "Pseudo" 8 8 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Meropenem/vaborbactam" "PK/PD" 8 8 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Moxifloxacin" "Enterobacteriaceae" "5" 22 22 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Moxifloxacin" "Enterobacteriaceae" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Corynebacterium" 3 "Moxifloxacin" "Corynebacterium spp." "5" 25 25 FALSE +"EUCAST 2022" "MIC" "Corynebacterium" 3 "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Moxifloxacin" "H. influenzae" "5" 28 28 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" "5" 26 26 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 28 28 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Moxifloxacin" "Staphs" "5" 25 25 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Moxifloxacin" "Strep A, B, C, G" "5" 19 19 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "S. pneumoniae" "5" 22 22 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2022" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 2 2 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Minocycline" "H. influenzae" "30" 24 24 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Minocycline" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Minocycline" "M. catarrhalis" "30" 25 25 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Minocycline" "M. catarrhalis" 1 1 FALSE +"EUCAST 2022" "MIC" "Prophylaxis" "Neisseria meningitidis" 2 "Minocycline" "N. meningitidis" 1 1 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Minocycline" "Staphs" "30" 23 23 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Minocycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Minocycline" "Strep A, B, C, G" "30" 23 23 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Minocycline" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Minocycline" "S. pneumoniae" "30" 24 24 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Minocycline" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Bacteroides" 3 "Metronidazole" "Bacteroides" "5" 25 25 FALSE +"EUCAST 2022" "MIC" "Bacteroides" 3 "Metronidazole" "Bacteroides" 4 4 FALSE +"EUCAST 2022" "MIC" "Clostridioides difficile" 2 "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2022" "DISK" "Clostridium perfringens" 2 "Metronidazole" "C. perfringens" "5" 16 16 FALSE +"EUCAST 2022" "MIC" "Clostridium perfringens" 2 "Metronidazole" "C. perfringens" 4 4 FALSE +"EUCAST 2022" "DISK" "Fusobacterium necrophorum" 2 "Metronidazole" "F. necrophorum" "5" 30 30 FALSE +"EUCAST 2022" "MIC" "Fusobacterium necrophorum" 2 "Metronidazole" "F. necrophorum" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Helicobacter pylori" 2 "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2022" "DISK" "Prevotella" 3 "Metronidazole" "Prevotella" "5" 22 22 FALSE +"EUCAST 2022" "MIC" "Prevotella" 3 "Metronidazole" "Prevotella" 4 4 FALSE +"EUCAST 2022" "DISK" "Screen" "Haemophilus" 3 "Nalidixic acid" "H. influenzae" "30" 23 7 FALSE +"EUCAST 2022" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. catarrhalis" "30" 23 7 FALSE +"EUCAST 2022" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2022" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2022" "DISK" "Aerococcus" 3 "Nitrofurantoin" "Aerococcus" 16 16 FALSE +"EUCAST 2022" "MIC" "Aerococcus" 3 "Nitrofurantoin" "Aerococcus" 16 16 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" "100" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2022" "DISK" "UTI" "Escherichia coli" 2 "Nitrofurantoin" "Enterobacteriaceae" "100" 11 11 TRUE +"EUCAST 2022" "MIC" "UTI" "Escherichia coli" 2 "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2022" "MIC" "UTI" "Staphylococcus" 3 "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2022" "DISK" "UTI" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE +"EUCAST 2022" "DISK" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" "100" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Norfloxacin" "Enterobacteriaceae" "10" 22 22 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Norfloxacin" "Enterobacteriaceae" 0.5 0.5 TRUE +"EUCAST 2022" "DISK" "Aerococcus" 3 "Norfloxacin" "Aerococcus" 17 17 FALSE +"EUCAST 2022" "DISK" "Screen" "Bacillus" 3 "Norfloxacin" "Bacillus sp." "10ug" 21 21 FALSE +"EUCAST 2022" "DISK" "Screen" "Enterococcus" 3 "Norfloxacin" "Enterococcus" "10" 12 12 FALSE +"EUCAST 2022" "DISK" "Screen" "Staphylococcus" 3 "Norfloxacin" "Staphs" "10" 17 7 FALSE +"EUCAST 2022" "DISK" "Screen" "Streptococcus" 3 "Norfloxacin" "Strep A, B, C, G" "10" 12 7 FALSE +"EUCAST 2022" "DISK" "Screen" "Streptococcus pneumoniae" 2 "Norfloxacin" "S. pneumoniae" "10" 10 7 FALSE +"EUCAST 2022" "DISK" "UTI" "Escherichia coli" 2 "Nitroxoline" "Enterobacteriaceae" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Escherichia coli" 2 "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" "5" 24 22 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Ofloxacin" "H. influenzae" "5" 30 30 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" "5" 28 28 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Neisseria gonorrhoeae" 2 "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Oritavancin" "PK/PD" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Screen" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Staphs" "1 unit" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "Staphylococcus schleiferi" 2 "Oxacillin" "Staphs" "1 unit" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "Streptococcus pneumoniae" 2 "Oxacillin" "S. pneumoniae" "1" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "Salmonella" 3 "Pefloxacin" "Enterobacteriaceae" "5" 24 24 FALSE +"EUCAST 2022" "DISK" "Screen" "Vibrio alginolyticus" 2 "Pefloxacin" "Vibrio" "5" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "Vibrio cholerae" 2 "Pefloxacin" "Vibrio" "5" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "Vibrio fluvialis" 2 "Pefloxacin" "Vibrio" "5" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "Vibrio parahaemolyticus" 2 "Pefloxacin" "Vibrio" "5" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "Vibrio vulnificus" 2 "Pefloxacin" "Vibrio" "5" 20 20 FALSE +"EUCAST 2022" "DISK" "Aerococcus" 3 "Benzylpenicillin" "Aerococcus" 21 21 FALSE +"EUCAST 2022" "MIC" "Aerococcus" 3 "Benzylpenicillin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Corynebacterium" 3 "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2022" "MIC" "Corynebacterium" 3 "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Cutibacterium acnes" 2 "Benzylpenicillin" "C. acnes" "5" 24 24 FALSE +"EUCAST 2022" "MIC" "Cutibacterium acnes" 2 "Benzylpenicillin" "C. acnes" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Clostridium perfringens" 2 "Benzylpenicillin" "C. perfringens" "1 unit" 15 15 FALSE +"EUCAST 2022" "MIC" "Clostridium perfringens" 2 "Benzylpenicillin" "C. perfringens" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Fusobacterium necrophorum" 2 "Benzylpenicillin" "F. necrophorum" "1 unit" 25 25 FALSE +"EUCAST 2022" "MIC" "Fusobacterium necrophorum" 2 "Benzylpenicillin" "F. necrophorum" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Screen" "Haemophilus" 3 "Benzylpenicillin" "H. influenzae" "1 unit" 12 7 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 25 25 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Listeria monocytogenes" 2 "Benzylpenicillin" "L. monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Listeria monocytogenes" 2 "Benzylpenicillin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2022" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2022" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Prevotella" 3 "Benzylpenicillin" "Prevotella" "1 unit" 20 20 FALSE +"EUCAST 2022" "MIC" "Prevotella" 3 "Benzylpenicillin" "Prevotella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "P. multocida" "1 unit" 17 17 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "P. multocida" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2022" "MIC" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2022" "DISK" "Meningitis" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 19 19 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "S. pneumoniae" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "S. pneumoniae" 0.064 2 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2022" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2022" "MIC" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 1024 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Piperacillin" "Enterobacteriaceae" "30" 20 20 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Piperacillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Piperacillin" "Pseudo" "30" 50 18 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Piperacillin" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2022" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2022" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2022" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Candida dubliniensis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2022" "DISK" "Aerococcus" 3 "Rifampicin" "Aerococcus" 25 25 FALSE +"EUCAST 2022" "MIC" "Aerococcus" 3 "Rifampicin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Corynebacterium" 3 "Rifampicin" "Corynebacterium spp." "5" 30 25 FALSE +"EUCAST 2022" "MIC" "Corynebacterium" 3 "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2022" "MIC" "Helicobacter pylori" 2 "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2022" "DISK" "Prophylaxis" "Haemophilus" 3 "Rifampicin" "H. influenzae" "5" 18 18 FALSE +"EUCAST 2022" "MIC" "Prophylaxis" "Haemophilus" 3 "Rifampicin" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Rifampicin" "Kingella" 20 20 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Rifampicin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Prophylaxis" "Neisseria meningitidis" 2 "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Rifampicin" "Staphs" "5" 26 26 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Rifampicin" "Staphs" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Rifampicin" "Strep A, B, C, G" "5" 21 21 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Rifampicin" "Strep A, B, C, G" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "S. pneumoniae" "5" 22 22 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "S. pneumoniae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Roxithromycin" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Roxithromycin" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ampicillin/sulbactam" "Enterobacteriaceae" "10-10" 14 14 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Ampicillin/sulbactam" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Ampicillin/sulbactam" "M. catarrhalis" 1 1 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2022" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Streptomycin-high" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Streptoduocin" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2022" "DISK" "Achromobacter denitrificans" 2 "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" "1.25ug/23.75ug" 26 26 FALSE +"EUCAST 2022" "MIC" "Achromobacter denitrificans" 2 "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Achromobacter xylosoxidans" 2 "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" "1.25ug/23.75ug" 26 26 FALSE +"EUCAST 2022" "MIC" "Achromobacter xylosoxidans" 2 "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2022" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "Aeromonas" "1.25ug/23.75ug" 19 16 FALSE +"EUCAST 2022" "MIC" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "Aeromonas" 2 4 FALSE +"EUCAST 2022" "DISK" "Burkholderia pseudomallei" 2 "Trimethoprim/sulfamethoxazole" "B. pseudomallei" "1.25ug/23.75ug" 50 17 FALSE +"EUCAST 2022" "MIC" "Burkholderia pseudomallei" 2 "Trimethoprim/sulfamethoxazole" "B. pseudomallei" 0.001 4 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 28 28 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "L. monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2022" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "L. monocytogenes" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2022" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2022" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 50 16 FALSE +"EUCAST 2022" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 0.001 4 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "S. pneumoniae" "1.25ug/23.75ug" 13 10 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "S. pneumoniae" 1 2 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75-10" 23 20 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Ticarcillin/clavulanic acid" "Pseudo" "75-10" 50 18 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Ticarcillin/clavulanic acid" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2022" "DISK" "Screen" "Burkholderia pseudomallei" 2 "Tetracycline" "B. pseudomallei" "30ug" 23 23 FALSE +"EUCAST 2022" "DISK" "Campylobacter coli" 2 "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE +"EUCAST 2022" "MIC" "Campylobacter coli" 2 "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE +"EUCAST 2022" "DISK" "Campylobacter jejuni" 2 "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE +"EUCAST 2022" "MIC" "Campylobacter jejuni" 2 "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE +"EUCAST 2022" "DISK" "Corynebacterium" 3 "Tetracycline" "Corynebacterium spp." "30" 24 24 FALSE +"EUCAST 2022" "MIC" "Corynebacterium" 3 "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2022" "MIC" "Helicobacter pylori" 2 "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Tetracycline" "H. influenzae" "30" 25 25 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Tetracycline" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "DISK" "Kingella kingae" 2 "Tetracycline" "Kingella" 28 28 FALSE +"EUCAST 2022" "MIC" "Kingella kingae" 2 "Tetracycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Tetracycline" "M. catarrhalis" "30" 26 26 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. catarrhalis" 2 2 FALSE +"EUCAST 2022" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Screen" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 2 2 FALSE +"EUCAST 2022" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE +"EUCAST 2022" "DISK" "Screen" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 22 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "Screen" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE +"EUCAST 2022" "DISK" "Screen" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 23 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2022" "MIC" "Screen" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Tetracycline" "S. pneumoniae" "30" 25 22 FALSE +"EUCAST 2022" "DISK" "Screen" "Streptococcus pneumoniae" 2 "Tetracycline" "S. pneumoniae" "30" 25 25 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "S. pneumoniae" 1 2 FALSE +"EUCAST 2022" "MIC" "Screen" "Streptococcus pneumoniae" 2 "Tetracycline" "S. pneumoniae" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Tetracycline" "Vibrio" "30" 20 20 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Tetracycline" "Vibrio" "30" 20 20 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Tetracycline" "Vibrio" "30" 20 20 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Tetracycline" "Vibrio" "30" 20 20 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Tetracycline" "Vibrio" "30" 20 20 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30" 16 16 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" "30" 15 15 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Teicoplanin" "S. pneumoniae" "30" 17 17 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Teicoplanin" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Teicoplanin" "Viridans strept" "30" 16 16 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "DISK" "UTI" "Escherichia coli" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Escherichia coli" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "Klebsiella" 3 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Klebsiella" 3 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "Klebsiella granulomatis" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Klebsiella granulomatis" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "Klebsiella oxytoca" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Klebsiella oxytoca" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "Klebsiella pneumoniae" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Klebsiella pneumoniae" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "Klebsiella pneumoniae ozaenae" 1 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Klebsiella pneumoniae ozaenae" 1 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "Klebsiella quasipneumoniae" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Klebsiella quasipneumoniae" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "Klebsiella variicola" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Klebsiella variicola" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "Proteus mirabilis" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "Proteus mirabilis" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "Citrobacter koseri" 2 "Tigecycline" "Enterobacteriaceae" "15" 18 18 FALSE +"EUCAST 2022" "MIC" "Citrobacter koseri" 2 "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Tigecycline" "Enterococcus" "15" 18 18 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Enterococcus faecium" 2 "Tigecycline" "Enterococcus" "15" 22 22 FALSE +"EUCAST 2022" "MIC" "Enterococcus faecium" 2 "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Enterococcus faecalis" 2 "Tigecycline" "Enterococcus" "15" 20 20 FALSE +"EUCAST 2022" "MIC" "Enterococcus faecalis" 2 "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Escherichia coli" 2 "Tigecycline" "Enterobacteriaceae" "15" 18 18 FALSE +"EUCAST 2022" "MIC" "Escherichia coli" 2 "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Tigecycline" "Staphs" "15" 19 19 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Tigecycline" "Strep A, B, C, G" "15" 19 19 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Tigecycline" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Tigecycline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Ticarcillin" "Enterobacteriaceae" "75" 23 20 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Ticarcillin" "Pseudo" "75" 50 18 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Ticarcillin" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Telithromycin" "H. influenzae" 8 8 FALSE +"EUCAST 2022" "DISK" "Moraxella catarrhalis" 2 "Telithromycin" "M. catarrhalis" "15" 23 20 FALSE +"EUCAST 2022" "MIC" "Moraxella catarrhalis" 2 "Telithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" "15" 20 17 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "S. pneumoniae" "15" 23 20 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 4 4 TRUE +"EUCAST 2022" "DISK" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5" 50 21 TRUE +"EUCAST 2022" "MIC" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2022" "DISK" "UTI" "Staphylococcus" 3 "Trimethoprim" "Staphs" "5" 14 14 TRUE +"EUCAST 2022" "MIC" "UTI" "Staphylococcus" 3 "Trimethoprim" "Staphs" 4 4 TRUE +"EUCAST 2022" "MIC" "UTI" "Streptococcus group B" 2 "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Tobramycin" "Enterobacteriaceae" "10" 16 16 FALSE +"EUCAST 2022" "DISK" "UTI" "Enterobacterales" 5 "Tobramycin" "Enterobacteriaceae" "10" 16 16 TRUE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Tobramycin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "MIC" "UTI" "Enterobacterales" 5 "Tobramycin" "Enterobacteriaceae" 2 2 TRUE +"EUCAST 2022" "DISK" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." "10" 17 17 FALSE +"EUCAST 2022" "DISK" "UTI" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." "10" 17 17 TRUE +"EUCAST 2022" "MIC" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2022" "MIC" "UTI" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." 4 4 TRUE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 18 18 FALSE +"EUCAST 2022" "DISK" "UTI" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 18 18 TRUE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseudo" 2 2 FALSE +"EUCAST 2022" "MIC" "UTI" "Pseudomonas" 3 "Tobramycin" "Pseudo" 2 2 TRUE +"EUCAST 2022" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2022" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10" 20 20 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Tobramycin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Staphylococcus" 3 "Tedizolid" "Staphs" "2ug" 20 20 FALSE +"EUCAST 2022" "MIC" "Staphylococcus" 3 "Tedizolid" "Staphs" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Tedizolid" "Strep A, B, C, G" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Tedizolid" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus anginosus" 2 "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Streptococcus anginosus" 2 "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus constellatus" 2 "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Streptococcus constellatus" 2 "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Streptococcus intermedius" 2 "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Streptococcus intermedius" 2 "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Enterobacterales" 5 "Piperacillin/tazobactam" "Enterobacteriaceae" "30-6" 20 20 FALSE +"EUCAST 2022" "MIC" "Enterobacterales" 5 "Piperacillin/tazobactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "Achromobacter denitrificans" 2 "Piperacillin/tazobactam" "A. xylosoxidans" "30-6" 26 26 FALSE +"EUCAST 2022" "MIC" "Achromobacter denitrificans" 2 "Piperacillin/tazobactam" "A. xylosoxidans" 4 4 FALSE +"EUCAST 2022" "DISK" "Achromobacter xylosoxidans" 2 "Piperacillin/tazobactam" "A. xylosoxidans" "30-6" 26 26 FALSE +"EUCAST 2022" "MIC" "Achromobacter xylosoxidans" 2 "Piperacillin/tazobactam" "A. xylosoxidans" 4 4 FALSE +"EUCAST 2022" "DISK" "Bacteroides" 3 "Piperacillin/tazobactam" "Bacteroides" "30-6" 20 20 FALSE +"EUCAST 2022" "MIC" "Bacteroides" 3 "Piperacillin/tazobactam" "Bacteroides" 8 8 FALSE +"EUCAST 2022" "DISK" "Cutibacterium acnes" 2 "Piperacillin/tazobactam" "C. acnes" "30-6" 27 27 FALSE +"EUCAST 2022" "MIC" "Cutibacterium acnes" 2 "Piperacillin/tazobactam" "C. acnes" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Clostridium perfringens" 2 "Piperacillin/tazobactam" "C. perfringens" "30-6" 24 24 FALSE +"EUCAST 2022" "MIC" "Clostridium perfringens" 2 "Piperacillin/tazobactam" "C. perfringens" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Fusobacterium necrophorum" 2 "Piperacillin/tazobactam" "F. necrophorum" "30-6" 32 32 FALSE +"EUCAST 2022" "MIC" "Fusobacterium necrophorum" 2 "Piperacillin/tazobactam" "F. necrophorum" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Haemophilus" 3 "Piperacillin/tazobactam" "H. influenzae" "30-6" 27 27 FALSE +"EUCAST 2022" "MIC" "Haemophilus" 3 "Piperacillin/tazobactam" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Prevotella" 3 "Piperacillin/tazobactam" "Prevotella" "30-6" 26 26 FALSE +"EUCAST 2022" "MIC" "Prevotella" 3 "Piperacillin/tazobactam" "Prevotella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Pseudomonas" 3 "Piperacillin/tazobactam" "Pseudo" "30-6" 50 18 FALSE +"EUCAST 2022" "MIC" "Pseudomonas" 3 "Piperacillin/tazobactam" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "DISK" "Vibrio alginolyticus" 2 "Piperacillin/tazobactam" "Vibrio" "30-6" 26 26 FALSE +"EUCAST 2022" "MIC" "Vibrio alginolyticus" 2 "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio cholerae" 2 "Piperacillin/tazobactam" "Vibrio" "30-6" 26 26 FALSE +"EUCAST 2022" "MIC" "Vibrio cholerae" 2 "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio fluvialis" 2 "Piperacillin/tazobactam" "Vibrio" "30-6" 26 26 FALSE +"EUCAST 2022" "MIC" "Vibrio fluvialis" 2 "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio parahaemolyticus" 2 "Piperacillin/tazobactam" "Vibrio" "30-6" 26 26 FALSE +"EUCAST 2022" "MIC" "Vibrio parahaemolyticus" 2 "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "Vibrio vulnificus" 2 "Piperacillin/tazobactam" "Vibrio" "30-6" 26 26 FALSE +"EUCAST 2022" "MIC" "Vibrio vulnificus" 2 "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2022" "DISK" "Aerococcus" 3 "Vancomycin" "Aerococcus" 16 16 FALSE +"EUCAST 2022" "MIC" "Aerococcus" 3 "Vancomycin" "Aerococcus" 1 1 FALSE +"EUCAST 2022" "DISK" "Bacillus" 3 "Vancomycin" "Bacillus sp." "5ug" 10 10 FALSE +"EUCAST 2022" "MIC" "Bacillus" 3 "Vancomycin" "Bacillus sp." 2 2 FALSE +"EUCAST 2022" "MIC" "Clostridioides difficile" 2 "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2022" "DISK" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." "5" 17 17 FALSE +"EUCAST 2022" "MIC" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2022" "DISK" "Cutibacterium acnes" 2 "Vancomycin" "C. acnes" "5" 22 22 FALSE +"EUCAST 2022" "MIC" "Cutibacterium acnes" 2 "Vancomycin" "C. acnes" 2 2 FALSE +"EUCAST 2022" "DISK" "Clostridium perfringens" 2 "Vancomycin" "C. perfringens" "5" 12 12 FALSE +"EUCAST 2022" "MIC" "Clostridium perfringens" 2 "Vancomycin" "C. perfringens" 2 2 FALSE +"EUCAST 2022" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5" 12 12 FALSE +"EUCAST 2022" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2022" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" "5" 13 13 FALSE +"EUCAST 2022" "MIC" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2022" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "S. pneumoniae" "5" 16 16 FALSE +"EUCAST 2022" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Viridans strept" "5" 15 15 FALSE +"EUCAST 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "MIC" "Aspergillus fumigatus" 2 "Voriconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Aspergillus nidulans" 2 "Voriconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "Candida albicans" 2 "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2022" "MIC" "Candida dubliniensis" 2 "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2022" "MIC" "Candida parapsilosis" 2 "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2022" "MIC" "Candida tropicalis" 2 "Voriconazole" "Candida" 0.125 0.25 FALSE "EUCAST 2021" "MIC" "Aspergillus fumigatus" 2 "Amphotericin B" "Aspergillus" 1 2 FALSE "EUCAST 2021" "MIC" "Aspergillus niger" 2 "Amphotericin B" "Aspergillus" 1 2 FALSE "EUCAST 2021" "MIC" "Candida" 3 "Amphotericin B" "Candida" 1 1 FALSE @@ -20,8 +1082,8 @@ "EUCAST 2021" "MIC" "Oral" "Haemophilus" 3 "Amoxicillin/clavulanic acid" "H. influenzae" 0.001 2 FALSE "EUCAST 2021" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" "2-1" 19 19 FALSE "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE -"EUCAST 2021" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2021" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE "EUCAST 2021" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "S. pneumoniae" 0.5 1 FALSE "EUCAST 2021" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE "EUCAST 2021" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 18 FALSE @@ -49,12 +1111,12 @@ "EUCAST 2021" "MIC" "Enterococcus" 3 "Ampicillin" "Enterococcus" 4 8 FALSE "EUCAST 2021" "DISK" "Non-meningitis" "Haemophilus" 3 "Ampicillin" "H. influenzae" "2" 18 18 FALSE "EUCAST 2021" "MIC" "Non-meningitis" "Haemophilus" 3 "Ampicillin" "H. influenzae" 1 1 FALSE -"EUCAST 2021" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "IV" "Listeria monocytogenes" 2 "Ampicillin" "L. monocytogenes" "2" 16 16 FALSE "EUCAST 2021" "MIC" "IV" "Listeria monocytogenes" 2 "Ampicillin" "L. monocytogenes" 1 1 FALSE "EUCAST 2021" "MIC" "Non-meningitis" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" 1 1 FALSE -"EUCAST 2021" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2021" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE "EUCAST 2021" "DISK" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ampicillin" "S. pneumoniae" "2" 22 16 FALSE "EUCAST 2021" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ampicillin" "S. pneumoniae" 0.5 2 FALSE "EUCAST 2021" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Ampicillin" "S. pneumoniae" 0.5 0.5 FALSE @@ -68,17 +1130,17 @@ "EUCAST 2021" "MIC" "Oral" "Haemophilus" 3 "Amoxicillin" "H. influenzae" 0.001 2 FALSE "EUCAST 2021" "MIC" "Kingella kingae" 2 "Amoxicillin" "Kingella" 0.125 0.125 FALSE "EUCAST 2021" "MIC" "Non-meningitis" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE "EUCAST 2021" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "S. pneumoniae" 0.5 0.5 FALSE "EUCAST 2021" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Amoxicillin" "S. pneumoniae" 0.5 1 FALSE "EUCAST 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2021" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE -"EUCAST 2021" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2021" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2021" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2021" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 0.002 4 FALSE -"EUCAST 2021" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2021" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 26 21 FALSE "EUCAST 2021" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2021" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 50 18 FALSE @@ -140,25 +1202,25 @@ "EUCAST 2021" "MIC" "Bacillus" 3 "Ciprofloxacin" "Bacillus sp." 0.001 0.5 FALSE "EUCAST 2021" "DISK" "Campylobacter coli" 2 "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE "EUCAST 2021" "MIC" "Campylobacter coli" 2 "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE -"EUCAST 2021" "DISK" "Campylobacter jejuni jejuni" 1 "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE -"EUCAST 2021" "MIC" "Campylobacter jejuni jejuni" 1 "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE +"EUCAST 2021" "DISK" "Campylobacter jejuni" 2 "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE +"EUCAST 2021" "MIC" "Campylobacter jejuni" 2 "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE "EUCAST 2021" "DISK" "Corynebacterium" 3 "Ciprofloxacin" "Corynebacterium spp." "5" 50 25 FALSE "EUCAST 2021" "MIC" "Corynebacterium" 3 "Ciprofloxacin" "Corynebacterium spp." 0.001 1 FALSE "EUCAST 2021" "DISK" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" "5" 15 15 TRUE "EUCAST 2021" "MIC" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" 4 4 TRUE "EUCAST 2021" "DISK" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2021" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 28 28 FALSE -"EUCAST 2021" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" "5" 31 31 FALSE "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE "EUCAST 2021" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE -"EUCAST 2021" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.03 FALSE +"EUCAST 2021" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE "EUCAST 2021" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 50 26 FALSE "EUCAST 2021" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.001 0.5 FALSE -"EUCAST 2021" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2021" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.06 FALSE +"EUCAST 2021" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 50 24 FALSE "EUCAST 2021" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 0.001 1 FALSE "EUCAST 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ciprofloxacin" "Staphs" "5" 50 21 FALSE @@ -193,7 +1255,7 @@ "EUCAST 2021" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "S. pneumoniae" 0.25 0.5 FALSE "EUCAST 2021" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE "EUCAST 2021" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2021" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.03 FALSE +"EUCAST 2021" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE "EUCAST 2021" "DISK" "Pneumonia" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE "EUCAST 2021" "DISK" "Non-pneumonia" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Staphs" "5" 20 17 FALSE "EUCAST 2021" "MIC" "Pneumonia" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Staphs" 1 1 FALSE @@ -207,7 +1269,7 @@ "EUCAST 2021" "DISK" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" "30" 32 32 FALSE "EUCAST 2021" "MIC" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE "EUCAST 2021" "DISK" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 30 30 FALSE -"EUCAST 2021" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" "30" 24 21 FALSE "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" 1 2 FALSE "EUCAST 2021" "MIC" "Neisseria gonorrhoeae" 2 "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE @@ -233,8 +1295,8 @@ "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. catarrhalis" 1 2 FALSE "EUCAST 2021" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2021" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE -"EUCAST 2021" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" 0.032 0.03 FALSE +"EUCAST 2021" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE "EUCAST 2021" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "S. pneumoniae" 0.5 2 FALSE "EUCAST 2021" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "S. pneumoniae" 0.5 0.5 FALSE "EUCAST 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE @@ -283,11 +1345,11 @@ "EUCAST 2021" "MIC" "Streptococcus" 3 "Daptomycin" "Strep A, B, C, G" 1 1 FALSE "EUCAST 2021" "MIC" "Escherichia coli" 2 "Delafloxacin" "Enterobacteriaceae" 0.125 0.125 FALSE "EUCAST 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Delafloxacin" "Staphs" 0.25 0.25 FALSE -"EUCAST 2021" "MIC" "Streptococcus" 3 "Delafloxacin" "Strep A, B, C, G" 0.032 0.03 FALSE -"EUCAST 2021" "MIC" "Streptococcus anginosus" 2 "Delafloxacin" "Viridans strept" 0.032 0.03 FALSE -"EUCAST 2021" "MIC" "Streptococcus constellatus" 2 "Delafloxacin" "Viridans strept" 0.032 0.03 FALSE -"EUCAST 2021" "MIC" "Streptococcus intermedius" 2 "Delafloxacin" "Viridans strept" 0.032 0.03 FALSE -"EUCAST 2021" "MIC" "Mycobacterium tuberculosis" 2 "Delamanid" "M. tuberculosis" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Streptococcus" 3 "Delafloxacin" "Strep A, B, C, G" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "Streptococcus anginosus" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "Streptococcus constellatus" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "Streptococcus intermedius" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "Mycobacterium tuberculosis" 2 "Delamanid" "M. tuberculosis" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Enterobacterales" 5 "Doripenem" "Enterobacteriaceae" "30" 24 21 FALSE "EUCAST 2021" "MIC" "Enterobacterales" 5 "Doripenem" "Enterobacteriaceae" 1 2 FALSE "EUCAST 2021" "DISK" "Acinetobacter" 3 "Doripenem" "Acinetobacter spp." "10" 50 22 FALSE @@ -304,7 +1366,7 @@ "EUCAST 2021" "MIC" "Haemophilus" 3 "Doxycycline" "H. influenzae" 1 2 FALSE "EUCAST 2021" "MIC" "Kingella kingae" 2 "Doxycycline" "Kingella" 0.5 0.5 FALSE "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. catarrhalis" 1 2 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE "EUCAST 2021" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2021" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE "EUCAST 2021" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "S. pneumoniae" 1 2 FALSE @@ -323,8 +1385,8 @@ "EUCAST 2021" "MIC" "Bacillus" 3 "Erythromycin" "Bacillus sp." 0.5 0.5 FALSE "EUCAST 2021" "DISK" "Campylobacter coli" 2 "Erythromycin" "C. jejuni, C. coli" "15" 24 24 FALSE "EUCAST 2021" "MIC" "Campylobacter coli" 2 "Erythromycin" "C. jejuni, C. coli" 8 8 FALSE -"EUCAST 2021" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "C. jejuni, C. coli" "15ug" 20 20 FALSE -"EUCAST 2021" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "C. jejuni, C. coli" 4 4 FALSE +"EUCAST 2021" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "C. jejuni, C. coli" "15ug" 20 20 FALSE +"EUCAST 2021" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "C. jejuni, C. coli" 4 4 FALSE "EUCAST 2021" "MIC" "Haemophilus" 3 "Erythromycin" "H. influenzae" 16 16 FALSE "EUCAST 2021" "DISK" "Kingella kingae" 2 "Erythromycin" "Kingella" 20 20 FALSE "EUCAST 2021" "MIC" "Kingella kingae" 2 "Erythromycin" "Kingella" 0.5 0.5 FALSE @@ -384,8 +1446,8 @@ "EUCAST 2021" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE "EUCAST 2021" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2021" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2021" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE -"EUCAST 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 80 FALSE +"EUCAST 2021" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE "EUCAST 2021" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 17 FALSE "EUCAST 2021" "DISK" "UTI" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 17 TRUE "EUCAST 2021" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 2 FALSE @@ -395,12 +1457,12 @@ "EUCAST 2021" "MIC" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2021" "MIC" "UTI" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." 4 4 TRUE "EUCAST 2021" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2021" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE +"EUCAST 2021" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE "EUCAST 2021" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE "EUCAST 2021" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE "EUCAST 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Gentamicin" "Staphs" 1 1 FALSE -"EUCAST 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 80 FALSE +"EUCAST 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE "EUCAST 2021" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 0.5 0.5 FALSE "EUCAST 2021" "MIC" "Enterobacterales" 5 "Imipenem/relebactam" "Enterobacteriaceae" 2 2 FALSE "EUCAST 2021" "DISK" "Acinetobacter" 3 "Imipenem/relebactam" "Acinetobacter spp." "10-25" 24 24 FALSE @@ -423,8 +1485,8 @@ "EUCAST 2021" "MIC" "Haemophilus" 3 "Imipenem" "H. influenzae" 2 2 FALSE "EUCAST 2021" "DISK" "Morganella" 3 "Imipenem" "Enterobacteriaceae" "10" 50 19 FALSE "EUCAST 2021" "MIC" "Morganella" 3 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE -"EUCAST 2021" "DISK" "Morganella morganii morganii" 1 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE -"EUCAST 2021" "MIC" "Morganella morganii morganii" 1 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2021" "DISK" "Morganella morganii" 2 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE +"EUCAST 2021" "MIC" "Morganella morganii" 2 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE "EUCAST 2021" "DISK" "Moraxella catarrhalis" 2 "Imipenem" "M. catarrhalis" "10" 29 29 FALSE "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Imipenem" "M. catarrhalis" 2 2 FALSE "EUCAST 2021" "DISK" "Proteus" 3 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE @@ -443,8 +1505,8 @@ "EUCAST 2021" "MIC" "Aspergillus fumigatus" 2 "Itraconazole" "Aspergillus" 1 2 FALSE "EUCAST 2021" "MIC" "Aspergillus nidulans" 2 "Itraconazole" "Aspergillus" 1 2 FALSE "EUCAST 2021" "MIC" "Aspergillus terreus" 2 "Itraconazole" "Aspergillus" 1 2 FALSE -"EUCAST 2021" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2021" "MIC" "Candida dubliniensis" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "Candida dubliniensis" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2021" "MIC" "Candida parapsilosis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2021" "MIC" "Candida tropicalis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2021" "MIC" "Staphylococcus" 3 "Kanamycin" "Staphs" 8 8 FALSE @@ -482,15 +1544,15 @@ "EUCAST 2021" "MIC" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" 4 4 TRUE "EUCAST 2021" "MIC" "Helicobacter pylori" 2 "Levofloxacin" "H. pylori" 1 1 FALSE "EUCAST 2021" "DISK" "Haemophilus" 3 "Levofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2021" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Kingella kingae" 2 "Levofloxacin" "Kingella" 28 28 FALSE "EUCAST 2021" "MIC" "Kingella kingae" 2 "Levofloxacin" "Kingella" 0.125 0.125 FALSE "EUCAST 2021" "DISK" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" "5" 29 29 FALSE "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE "EUCAST 2021" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 50 22 FALSE "EUCAST 2021" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 0.001 1 FALSE -"EUCAST 2021" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE +"EUCAST 2021" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 50 24 FALSE "EUCAST 2021" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 0.001 1 FALSE "EUCAST 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Levofloxacin" "Staphs" "5" 50 22 FALSE @@ -534,7 +1596,7 @@ "EUCAST 2021" "MIC" "Non-meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 2 2 FALSE "EUCAST 2021" "MIC" "Meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 0.25 0.25 FALSE "EUCAST 2021" "DISK" "Kingella kingae" 2 "Meropenem" "Kingella" 30 30 FALSE -"EUCAST 2021" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.03 FALSE +"EUCAST 2021" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.032 FALSE "EUCAST 2021" "DISK" "Listeria monocytogenes" 2 "Meropenem" "L. monocytogenes" "10" 26 26 FALSE "EUCAST 2021" "MIC" "Listeria monocytogenes" 2 "Meropenem" "L. monocytogenes" 0.25 0.25 FALSE "EUCAST 2021" "DISK" "Moraxella catarrhalis" 2 "Meropenem" "M. catarrhalis" "10" 33 33 FALSE @@ -569,8 +1631,8 @@ "EUCAST 2021" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "S. pneumoniae" "5" 22 22 FALSE "EUCAST 2021" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "S. pneumoniae" 0.5 0.5 FALSE "EUCAST 2021" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE -"EUCAST 2021" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2021" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.015 FALSE +"EUCAST 2021" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE "EUCAST 2021" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 0.002 2 FALSE "EUCAST 2021" "DISK" "Haemophilus" 3 "Minocycline" "H. influenzae" "30" 24 24 FALSE "EUCAST 2021" "MIC" "Haemophilus" 3 "Minocycline" "H. influenzae" 1 1 FALSE @@ -587,7 +1649,7 @@ "EUCAST 2021" "MIC" "Helicobacter pylori" 2 "Metronidazole" "H. pylori" 8 8 FALSE "EUCAST 2021" "DISK" "Screen" "Haemophilus" 3 "Nalidixic acid" "H. influenzae" "30" 23 7 FALSE "EUCAST 2021" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. catarrhalis" "30" 23 7 FALSE -"EUCAST 2021" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2021" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE "EUCAST 2021" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE "EUCAST 2021" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE @@ -600,7 +1662,7 @@ "EUCAST 2021" "DISK" "UTI" "Escherichia coli" 2 "Nitrofurantoin" "Enterobacteriaceae" "100" 11 11 TRUE "EUCAST 2021" "MIC" "UTI" "Escherichia coli" 2 "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE "EUCAST 2021" "MIC" "UTI" "Staphylococcus" 3 "Nitrofurantoin" "Staphs" 64 64 TRUE -"EUCAST 2021" "DISK" "UTI" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE +"EUCAST 2021" "DISK" "UTI" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE "EUCAST 2021" "DISK" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" "100" 15 15 TRUE "EUCAST 2021" "MIC" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE "EUCAST 2021" "DISK" "UTI" "Enterobacterales" 5 "Norfloxacin" "Enterobacteriaceae" "10" 22 22 TRUE @@ -616,7 +1678,7 @@ "EUCAST 2021" "DISK" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" "5" 24 22 FALSE "EUCAST 2021" "MIC" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE "EUCAST 2021" "DISK" "Haemophilus" 3 "Ofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2021" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" "5" 28 28 FALSE "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE "EUCAST 2021" "MIC" "Neisseria gonorrhoeae" 2 "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE @@ -635,13 +1697,13 @@ "EUCAST 2021" "MIC" "Corynebacterium" 3 "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE "EUCAST 2021" "DISK" "Screen" "Haemophilus" 3 "Benzylpenicillin" "H. influenzae" "1 unit" 12 7 FALSE "EUCAST 2021" "DISK" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 25 25 FALSE -"EUCAST 2021" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.03 FALSE +"EUCAST 2021" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE "EUCAST 2021" "DISK" "Non-meningitis" "Listeria monocytogenes" 2 "Benzylpenicillin" "L. monocytogenes" "1 unit" 13 13 FALSE "EUCAST 2021" "MIC" "Non-meningitis" "Listeria monocytogenes" 2 "Benzylpenicillin" "L. monocytogenes" 1 1 FALSE "EUCAST 2021" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE "EUCAST 2021" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.25 0.25 FALSE -"EUCAST 2021" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "P. multocida" "1 unit" 17 17 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "P. multocida" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "P. multocida" "1 unit" 17 17 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "P. multocida" 0.5 0.5 FALSE "EUCAST 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE "EUCAST 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2021" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE @@ -650,7 +1712,7 @@ "EUCAST 2021" "DISK" "Meningitis" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 19 19 FALSE "EUCAST 2021" "MIC" "Non-meningitis" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2021" "MIC" "Meningitis" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.125 0.125 FALSE -"EUCAST 2021" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "S. pneumoniae" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "S. pneumoniae" 0.064 0.064 FALSE "EUCAST 2021" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "S. pneumoniae" 0.064 2 FALSE "EUCAST 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE "EUCAST 2021" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE @@ -664,10 +1726,10 @@ "EUCAST 2021" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE "EUCAST 2021" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE "EUCAST 2021" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE -"EUCAST 2021" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2021" "MIC" "Candida dubliniensis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2021" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2021" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "Candida dubliniensis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE "EUCAST 2021" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2021" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE @@ -723,11 +1785,11 @@ "EUCAST 2021" "DISK" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 28 28 FALSE "EUCAST 2021" "MIC" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE "EUCAST 2021" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "L. monocytogenes" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2021" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "L. monocytogenes" 0.064 0.06 FALSE +"EUCAST 2021" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "L. monocytogenes" 0.064 0.064 FALSE "EUCAST 2021" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE -"EUCAST 2021" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2021" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2021" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE "EUCAST 2021" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 50 16 FALSE "EUCAST 2021" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 0.001 4 FALSE "EUCAST 2021" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -744,8 +1806,8 @@ "EUCAST 2021" "DISK" "Screen" "Burkholderia pseudomallei" 2 "Tetracycline" "B. pseudomallei" "30ug" 50 23 FALSE "EUCAST 2021" "DISK" "Campylobacter coli" 2 "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE "EUCAST 2021" "MIC" "Campylobacter coli" 2 "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE -"EUCAST 2021" "DISK" "Campylobacter jejuni jejuni" 1 "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE -"EUCAST 2021" "MIC" "Campylobacter jejuni jejuni" 1 "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE +"EUCAST 2021" "DISK" "Campylobacter jejuni" 2 "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE +"EUCAST 2021" "MIC" "Campylobacter jejuni" 2 "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE "EUCAST 2021" "DISK" "Corynebacterium" 3 "Tetracycline" "Corynebacterium spp." "30" 24 24 FALSE "EUCAST 2021" "MIC" "Corynebacterium" 3 "Tetracycline" "Corynebacterium spp." 2 2 FALSE "EUCAST 2021" "MIC" "Helicobacter pylori" 2 "Tetracycline" "H. pylori" 1 1 FALSE @@ -757,7 +1819,7 @@ "EUCAST 2021" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. catarrhalis" 1 2 FALSE "EUCAST 2021" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE "EUCAST 2021" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 2 2 FALSE -"EUCAST 2021" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2021" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE "EUCAST 2021" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE "EUCAST 2021" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2021" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE @@ -782,12 +1844,10 @@ "EUCAST 2021" "MIC" "UTI" "Klebsiella granulomatis" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE "EUCAST 2021" "DISK" "UTI" "Klebsiella oxytoca" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE "EUCAST 2021" "MIC" "UTI" "Klebsiella oxytoca" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "Klebsiella pneumoniae" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "Klebsiella pneumoniae" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE "EUCAST 2021" "DISK" "UTI" "Klebsiella pneumoniae ozaenae" 1 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE "EUCAST 2021" "MIC" "UTI" "Klebsiella pneumoniae ozaenae" 1 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE -"EUCAST 2021" "DISK" "UTI" "Klebsiella pneumoniae pneumoniae" 1 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE -"EUCAST 2021" "MIC" "UTI" "Klebsiella pneumoniae pneumoniae" 1 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE -"EUCAST 2021" "DISK" "UTI" "Klebsiella pneumoniae rhinoscleromatis" 1 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE -"EUCAST 2021" "MIC" "UTI" "Klebsiella pneumoniae rhinoscleromatis" 1 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE "EUCAST 2021" "DISK" "UTI" "Klebsiella quasipneumoniae" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE "EUCAST 2021" "MIC" "UTI" "Klebsiella quasipneumoniae" 2 "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE "EUCAST 2021" "DISK" "UTI" "Klebsiella variicola" 2 "Temocillin" "Enterobacteriaceae" "30" 50 17 TRUE @@ -911,8 +1971,8 @@ "EUCAST 2020" "MIC" "Oral" "Haemophilus" 3 "Amoxicillin/clavulanic acid" "H. influenzae" 0.001 2 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" "2-1" 19 19 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE -"EUCAST 2020" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2020" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE "EUCAST 2020" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Pneumo" 0.5 1 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE "EUCAST 2020" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 18 FALSE @@ -927,8 +1987,8 @@ "EUCAST 2020" "DISK" "UTI" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 15 15 TRUE "EUCAST 2020" "MIC" "Pseudomonas" 3 "Amikacin" "Pseudo" 16 16 FALSE "EUCAST 2020" "MIC" "UTI" "Pseudomonas" 3 "Amikacin" "Pseudo" 16 16 TRUE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" "30" 18 18 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" 8 8 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30" 18 18 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 8 8 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30" 22 22 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 8 8 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Amikacin" "PK/PD" 1 1 FALSE @@ -940,12 +2000,12 @@ "EUCAST 2020" "MIC" "Enterococcus" 3 "Ampicillin" "Enterococcus" 4 8 FALSE "EUCAST 2020" "DISK" "Haemophilus" 3 "Ampicillin" "H. influenzae" "2" 18 18 FALSE "EUCAST 2020" "MIC" "Haemophilus" 3 "Ampicillin" "H. influenzae" 1 1 FALSE -"EUCAST 2020" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "IV" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" "2" 16 16 FALSE "EUCAST 2020" "MIC" "IV" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2020" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" 1 1 FALSE -"EUCAST 2020" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2020" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE "EUCAST 2020" "DISK" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" "2" 22 16 FALSE "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" 0.5 2 FALSE "EUCAST 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2" 21 15 FALSE @@ -958,16 +2018,16 @@ "EUCAST 2020" "MIC" "Oral" "Haemophilus" 3 "Amoxicillin" "H. influenzae" 0.001 2 FALSE "EUCAST 2020" "MIC" "Kingella kingae" 2 "Amoxicillin" "Kingella" 0.125 0.125 FALSE "EUCAST 2020" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE "EUCAST 2020" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Amoxicillin" "Pneumo" 0.5 1 FALSE "EUCAST 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE -"EUCAST 2020" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2020" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2020" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2020" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 0.002 4 FALSE -"EUCAST 2020" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2020" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 26 21 FALSE "EUCAST 2020" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2020" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 50 18 FALSE @@ -981,8 +2041,8 @@ "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Azithromycin" "Pneumo" 0.25 0.5 FALSE "EUCAST 2020" "MIC" "Mycobacterium tuberculosis" 2 "Bedaquiline" "M. tuberculosis" 0.25 0.25 FALSE "EUCAST 2020" "DISK" "Enterobacterales" 5 "Ceftobiprole" "Enterobacteriaceae" 23 23 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" "5" 17 17 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" "5" 17 17 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" 2 2 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Ceftobiprole" "PK/PD" 4 4 FALSE "EUCAST 2020" "DISK" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" "10" 22 19 FALSE "EUCAST 2020" "MIC" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE @@ -1031,27 +2091,27 @@ "EUCAST 2020" "MIC" "Campylobacter" 3 "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE "EUCAST 2020" "DISK" "Campylobacter coli" 2 "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE "EUCAST 2020" "MIC" "Campylobacter coli" 2 "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE -"EUCAST 2020" "DISK" "Campylobacter jejuni jejuni" 1 "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE -"EUCAST 2020" "MIC" "Campylobacter jejuni jejuni" 1 "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "Campylobacter jejuni" 2 "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2020" "MIC" "Campylobacter jejuni" 2 "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE "EUCAST 2020" "DISK" "Corynebacterium" 3 "Ciprofloxacin" "Corynebacterium spp." "5" 25 25 FALSE "EUCAST 2020" "MIC" "Corynebacterium" 3 "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2020" "DISK" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" "5" 15 15 TRUE "EUCAST 2020" "MIC" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" 4 4 TRUE "EUCAST 2020" "DISK" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2020" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 28 28 FALSE -"EUCAST 2020" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" "5" 31 31 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE "EUCAST 2020" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE -"EUCAST 2020" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.03 FALSE +"EUCAST 2020" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE "EUCAST 2020" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 50 26 FALSE "EUCAST 2020" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.001 0.5 FALSE -"EUCAST 2020" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2020" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.06 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Ciprofloxacin" "Staphs" "5" 50 21 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Ciprofloxacin" "Staphs" "5" 50 21 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Ciprofloxacin" "Staphs" 0.001 1 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 50 24 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 0.001 1 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE @@ -1082,11 +2142,11 @@ "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE "EUCAST 2020" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE "EUCAST 2020" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2020" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.03 FALSE -"EUCAST 2020" "DISK" "Pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 20 FALSE -"EUCAST 2020" "DISK" "Non-pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 17 FALSE -"EUCAST 2020" "MIC" "Pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 1 FALSE -"EUCAST 2020" "MIC" "Non-pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2020" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2020" "DISK" "Pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE +"EUCAST 2020" "DISK" "Non-pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 17 FALSE +"EUCAST 2020" "MIC" "Pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2020" "MIC" "Non-pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 2 FALSE "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "Pneumo" 0.25 0.25 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Ceftaroline" "PK/PD" 0.5 0.5 FALSE "EUCAST 2020" "DISK" "Oral" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 25 22 FALSE @@ -1094,7 +2154,7 @@ "EUCAST 2020" "DISK" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" "30" 32 32 FALSE "EUCAST 2020" "MIC" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 30 30 FALSE -"EUCAST 2020" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" "30" 24 21 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" 1 2 FALSE "EUCAST 2020" "MIC" "Neisseria gonorrhoeae" 2 "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE @@ -1117,8 +2177,8 @@ "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. catarrhalis" 1 2 FALSE "EUCAST 2020" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2020" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE -"EUCAST 2020" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" 0.032 0.03 FALSE +"EUCAST 2020" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" "Pneumo" 0.5 2 FALSE "EUCAST 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE "EUCAST 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE @@ -1164,17 +2224,17 @@ "EUCAST 2020" "MIC" "Staphylococcus" 3 "Daptomycin" "Staphs" 1 1 FALSE "EUCAST 2020" "MIC" "Streptococcus" 3 "Daptomycin" "Strep A, B, C, G" 1 1 FALSE "EUCAST 2020" "MIC" "Escherichia coli" 2 "Delafloxacin" "Enterobacteriaceae" 0.125 0.125 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Delafloxacin" "Staphs" 0.25 0.25 FALSE -"EUCAST 2020" "MIC" "Streptococcus" 3 "Delafloxacin" "Strep A, B, C, G" 0.032 0.03 FALSE -"EUCAST 2020" "MIC" "Streptococcus anginosus" 2 "Delafloxacin" "Viridans strept" 0.032 0.03 FALSE -"EUCAST 2020" "MIC" "Streptococcus constellatus" 2 "Delafloxacin" "Viridans strept" 0.032 0.03 FALSE -"EUCAST 2020" "MIC" "Streptococcus intermedius" 2 "Delafloxacin" "Viridans strept" 0.032 0.03 FALSE -"EUCAST 2020" "MIC" "Mycobacterium tuberculosis" 2 "Delamanid" "M. tuberculosis" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Delafloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "Streptococcus" 3 "Delafloxacin" "Strep A, B, C, G" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "Streptococcus anginosus" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "Streptococcus constellatus" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "Streptococcus intermedius" 2 "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "Mycobacterium tuberculosis" 2 "Delamanid" "M. tuberculosis" 0.064 0.064 FALSE "EUCAST 2020" "MIC" "Burkholderia pseudomallei" 2 "Doxycycline" "B. pseudomallei" 0.001 2 FALSE "EUCAST 2020" "MIC" "Haemophilus" 3 "Doxycycline" "H. influenzae" 1 2 FALSE "EUCAST 2020" "MIC" "Kingella kingae" 2 "Doxycycline" "Kingella" 0.5 0.5 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. catarrhalis" 1 2 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE "EUCAST 2020" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2020" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Pneumo" 1 2 FALSE @@ -1185,15 +2245,15 @@ "EUCAST 2020" "MIC" "Enterococcus faecalis" 2 "Eravacycline" "Enterococcus" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Escherichia coli" 2 "Eravacycline" "Enterobacteriaceae" "20ug" 17 17 FALSE "EUCAST 2020" "MIC" "Escherichia coli" 2 "Eravacycline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Eravacycline" "Staphs" "20ug" 20 20 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Eravacycline" "Staphs" "20ug" 20 20 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Eravacycline" "Staphs" 0.25 0.25 FALSE "EUCAST 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Eravacycline" "Staphs" 0.25 0.25 FALSE "EUCAST 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Eravacycline" "Viridans strept" "20ug" 17 17 FALSE "EUCAST 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Eravacycline" "Viridans strept" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 24 24 FALSE "EUCAST 2020" "MIC" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE -"EUCAST 2020" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE -"EUCAST 2020" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2020" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE +"EUCAST 2020" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE "EUCAST 2020" "MIC" "Haemophilus" 3 "Erythromycin" "H. influenzae" 16 16 FALSE "EUCAST 2020" "DISK" "Kingella kingae" 2 "Erythromycin" "Kingella" 20 20 FALSE "EUCAST 2020" "MIC" "Kingella kingae" 2 "Erythromycin" "Kingella" 0.5 0.5 FALSE @@ -1242,18 +2302,18 @@ "EUCAST 2020" "MIC" "Staphylococcus" 3 "Fosfomycin" "Staphs" 32 32 FALSE "EUCAST 2020" "DISK" "Screen" "Enterobacterales" 5 "Cefoxitin" "Enterobacteriaceae" "30" 19 19 FALSE "EUCAST 2020" "DISK" "Screen" "Staphylococcus" 3 "Cefoxitin" "Staphs" "30" 22 22 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2020" "DISK" "Screen" "Coagulase-negative Staphylococcus (CoNS)" 2 "Cefoxitin" "Staphs" "30" 25 25 FALSE "EUCAST 2020" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2020" "DISK" "Screen" "Staphylococcus pseudintermedius" 2 "Cefoxitin" "Staphs" "30" 20 20 FALSE -"EUCAST 2020" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" 22 22 FALSE -"EUCAST 2020" "MIC" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" 8 8 FALSE +"EUCAST 2020" "DISK" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" 22 22 FALSE +"EUCAST 2020" "MIC" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" 8 8 FALSE "EUCAST 2020" "MIC" "Clostridioides difficile" 2 "Fusidic acid" "C. difficile" 2 1024 FALSE "EUCAST 2020" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE "EUCAST 2020" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2020" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2020" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE -"EUCAST 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 80 FALSE +"EUCAST 2020" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE "EUCAST 2020" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 17 FALSE "EUCAST 2020" "DISK" "UTI" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 17 TRUE "EUCAST 2020" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 2 FALSE @@ -1263,12 +2323,12 @@ "EUCAST 2020" "MIC" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2020" "MIC" "UTI" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." 4 4 TRUE "EUCAST 2020" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2020" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2020" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE -"EUCAST 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 80 FALSE +"EUCAST 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 0.5 0.5 FALSE "EUCAST 2020" "MIC" "Enterobacterales" 5 "Imipenem/relebactam" "Enterobacteriaceae" 2 2 FALSE "EUCAST 2020" "MIC" "Acinetobacter" 3 "Imipenem/relebactam" "Acinetobacter spp." 2 2 FALSE @@ -1285,8 +2345,8 @@ "EUCAST 2020" "MIC" "Enterococcus" 3 "Imipenem" "Enterococcus" 0.001 4 FALSE "EUCAST 2020" "DISK" "Haemophilus" 3 "Imipenem" "H. influenzae" "10" 20 20 FALSE "EUCAST 2020" "MIC" "Haemophilus" 3 "Imipenem" "H. influenzae" 2 2 FALSE -"EUCAST 2020" "DISK" "Morganella morganii morganii" 1 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE -"EUCAST 2020" "MIC" "Morganella morganii morganii" 1 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2020" "DISK" "Morganella morganii" 2 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE +"EUCAST 2020" "MIC" "Morganella morganii" 2 "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Imipenem" "M. catarrhalis" "10" 29 29 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Imipenem" "M. catarrhalis" 2 2 FALSE "EUCAST 2020" "DISK" "Proteus" 3 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE @@ -1305,12 +2365,12 @@ "EUCAST 2020" "MIC" "Aspergillus fumigatus" 2 "Itraconazole" "Aspergillus" 1 2 FALSE "EUCAST 2020" "MIC" "Aspergillus nidulans" 2 "Itraconazole" "Aspergillus" 1 2 FALSE "EUCAST 2020" "MIC" "Aspergillus terreus" 2 "Itraconazole" "Aspergillus" 1 2 FALSE -"EUCAST 2020" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2020" "MIC" "Candida dubliniensis" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "Candida dubliniensis" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2020" "MIC" "Candida parapsilosis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2020" "MIC" "Candida tropicalis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2020" "MIC" "Staphylococcus" 3 "Kanamycin" "Staphs" 8 8 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Kanamycin" "Staphs" "30" 18 18 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Kanamycin" "Staphs" "30" 18 18 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Kanamycin" "Staphs" 22 22 FALSE "EUCAST 2020" "DISK" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" "30" 14 14 TRUE "EUCAST 2020" "MIC" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" 16 16 TRUE @@ -1336,17 +2396,17 @@ "EUCAST 2020" "MIC" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" 4 4 TRUE "EUCAST 2020" "MIC" "Helicobacter pylori" 2 "Levofloxacin" "H. pylori" 1 1 FALSE "EUCAST 2020" "DISK" "Haemophilus" 3 "Levofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2020" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "Kingella kingae" 2 "Levofloxacin" "Kingella" 28 28 FALSE "EUCAST 2020" "MIC" "Kingella kingae" 2 "Levofloxacin" "Kingella" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" "5" 29 29 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 50 22 FALSE "EUCAST 2020" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 0.001 1 FALSE -"EUCAST 2020" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Levofloxacin" "Staphs" "5" 50 22 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Levofloxacin" "Staphs" "5" 50 22 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Levofloxacin" "Staphs" 0.001 1 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 50 24 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 0.001 1 FALSE "EUCAST 2020" "DISK" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" "5" 50 17 FALSE @@ -1368,7 +2428,7 @@ "EUCAST 2020" "MIC" "Non-meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 2 2 FALSE "EUCAST 2020" "MIC" "Meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 0.25 0.25 FALSE "EUCAST 2020" "DISK" "Kingella kingae" 2 "Meropenem" "Kingella" 30 30 FALSE -"EUCAST 2020" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.03 FALSE +"EUCAST 2020" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.032 FALSE "EUCAST 2020" "DISK" "Listeria monocytogenes" 2 "Meropenem" "Listeria monocytogenes" "10" 26 26 FALSE "EUCAST 2020" "MIC" "Listeria monocytogenes" 2 "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Meropenem" "M. catarrhalis" "10" 33 33 FALSE @@ -1392,8 +2452,8 @@ "EUCAST 2020" "MIC" "Haemophilus" 3 "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" "5" 26 26 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Moxifloxacin" "Staphs" "5" 25 25 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Moxifloxacin" "Staphs" "5" 25 25 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 28 28 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE "EUCAST 2020" "DISK" "Streptococcus" 3 "Moxifloxacin" "Strep A, B, C, G" "5" 19 19 FALSE @@ -1401,8 +2461,8 @@ "EUCAST 2020" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" "5" 22 22 FALSE "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE -"EUCAST 2020" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2020" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.015 FALSE +"EUCAST 2020" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE "EUCAST 2020" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 0.002 2 FALSE "EUCAST 2020" "DISK" "Haemophilus" 3 "Minocycline" "H. influenzae" "30" 24 24 FALSE "EUCAST 2020" "MIC" "Haemophilus" 3 "Minocycline" "H. influenzae" 1 1 FALSE @@ -1419,9 +2479,9 @@ "EUCAST 2020" "MIC" "Helicobacter pylori" 2 "Metronidazole" "H. pylori" 8 8 FALSE "EUCAST 2020" "DISK" "Screen" "Haemophilus" 3 "Nalidixic acid" "H. influenzae" "30" 23 7 FALSE "EUCAST 2020" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. catarrhalis" "30" 23 7 FALSE -"EUCAST 2020" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2020" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Netilmicin" "PK/PD" 2 4 FALSE @@ -1432,7 +2492,7 @@ "EUCAST 2020" "DISK" "UTI" "Escherichia coli" 2 "Nitrofurantoin" "Enterobacteriaceae" "100" 11 11 TRUE "EUCAST 2020" "MIC" "UTI" "Escherichia coli" 2 "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE "EUCAST 2020" "MIC" "UTI" "Staphylococcus" 3 "Nitrofurantoin" "Staphs" 64 64 TRUE -"EUCAST 2020" "DISK" "UTI" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE +"EUCAST 2020" "DISK" "UTI" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE "EUCAST 2020" "DISK" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" "100" 15 15 TRUE "EUCAST 2020" "MIC" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE "EUCAST 2020" "DISK" "UTI" "Enterobacterales" 5 "Norfloxacin" "Enterobacteriaceae" "10" 22 22 TRUE @@ -1447,12 +2507,12 @@ "EUCAST 2020" "DISK" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" "5" 24 22 FALSE "EUCAST 2020" "MIC" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE "EUCAST 2020" "DISK" "Haemophilus" 3 "Ofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2020" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" "5" 28 28 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE "EUCAST 2020" "MIC" "Neisseria gonorrhoeae" 2 "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Ofloxacin" "Staphs" "5" 50 20 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Ofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Ofloxacin" "Staphs" "5" 50 20 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Ofloxacin" "Staphs" 0.001 1 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ofloxacin" "Staphs" 50 24 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ofloxacin" "Staphs" 0.001 1 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Ofloxacin" "PK/PD" 0.25 0.5 FALSE @@ -1460,11 +2520,11 @@ "EUCAST 2020" "MIC" "Streptococcus" 3 "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Viridans strept" 0.25 0.25 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Oritavancin" "PK/PD" 0.125 0.125 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2020" "MIC" "Staphylococcus epidermidis" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2020" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Staphs" 2 2 FALSE -"EUCAST 2020" "MIC" "Staphylococcus saprophyticus saprophyticus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "Staphylococcus saprophyticus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2020" "DISK" "Screen" "Streptococcus pneumoniae" 2 "Oxacillin" "Pneumo" "1" 20 7 FALSE "EUCAST 2020" "DISK" "Screen" "Salmonella" 3 "Pefloxacin" "Enterobacteriaceae" "5" 24 24 FALSE "EUCAST 2020" "DISK" "Aerococcus" 3 "Benzylpenicillin" "Aerococcus" 21 21 FALSE @@ -1473,20 +2533,20 @@ "EUCAST 2020" "MIC" "Corynebacterium" 3 "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Screen" "Haemophilus" 3 "Benzylpenicillin" "H. influenzae" "1 unit" 12 7 FALSE "EUCAST 2020" "DISK" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 25 25 FALSE -"EUCAST 2020" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.03 FALSE +"EUCAST 2020" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE "EUCAST 2020" "DISK" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE "EUCAST 2020" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2020" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE "EUCAST 2020" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE -"EUCAST 2020" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE "EUCAST 2020" "MIC" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE "EUCAST 2020" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE -"EUCAST 2020" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE "EUCAST 2020" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 2 FALSE "EUCAST 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE "EUCAST 2020" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE @@ -1499,10 +2559,10 @@ "EUCAST 2020" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE "EUCAST 2020" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE "EUCAST 2020" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE -"EUCAST 2020" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2020" "MIC" "Candida dubliniensis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2020" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2020" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "Candida dubliniensis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE "EUCAST 2020" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2020" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE @@ -1554,11 +2614,11 @@ "EUCAST 2020" "DISK" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 28 28 FALSE "EUCAST 2020" "MIC" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE "EUCAST 2020" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2020" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.06 FALSE +"EUCAST 2020" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE "EUCAST 2020" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE -"EUCAST 2020" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2020" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2020" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE "EUCAST 2020" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 50 16 FALSE "EUCAST 2020" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 0.001 4 FALSE "EUCAST 2020" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -1577,8 +2637,8 @@ "EUCAST 2020" "MIC" "Campylobacter" 3 "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE "EUCAST 2020" "DISK" "Campylobacter coli" 2 "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE "EUCAST 2020" "MIC" "Campylobacter coli" 2 "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE -"EUCAST 2020" "DISK" "Campylobacter jejuni jejuni" 1 "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE -"EUCAST 2020" "MIC" "Campylobacter jejuni jejuni" 1 "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2020" "DISK" "Campylobacter jejuni" 2 "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2020" "MIC" "Campylobacter jejuni" 2 "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE "EUCAST 2020" "DISK" "Corynebacterium" 3 "Tetracycline" "Corynebacterium spp." "30" 24 24 FALSE "EUCAST 2020" "MIC" "Corynebacterium" 3 "Tetracycline" "Corynebacterium spp." 2 2 FALSE "EUCAST 2020" "MIC" "Helicobacter pylori" 2 "Tetracycline" "H. pylori" 1 1 FALSE @@ -1590,7 +2650,7 @@ "EUCAST 2020" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. catarrhalis" 1 2 FALSE "EUCAST 2020" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE "EUCAST 2020" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 2 2 FALSE -"EUCAST 2020" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2020" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE "EUCAST 2020" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE "EUCAST 2020" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2020" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE @@ -1599,7 +2659,7 @@ "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Pneumo" 1 2 FALSE "EUCAST 2020" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30" 16 16 FALSE "EUCAST 2020" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" "Staphs" 2 2 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE "EUCAST 2020" "DISK" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" "30" 15 15 FALSE "EUCAST 2020" "MIC" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE @@ -1635,7 +2695,7 @@ "EUCAST 2020" "MIC" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2020" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" "15" 23 20 FALSE "EUCAST 2020" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" 0.25 0.5 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Staphs" 0.125 0.125 FALSE "EUCAST 2020" "DISK" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5" 15 15 TRUE "EUCAST 2020" "MIC" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 4 4 TRUE "EUCAST 2020" "DISK" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5" 50 21 TRUE @@ -1655,8 +2715,8 @@ "EUCAST 2020" "DISK" "UTI" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 18 18 TRUE "EUCAST 2020" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseudo" 2 2 FALSE "EUCAST 2020" "MIC" "UTI" "Pseudomonas" 3 "Tobramycin" "Pseudo" 2 2 TRUE -"EUCAST 2020" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" "10" 18 18 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2020" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2020" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10" 22 22 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2020" "MIC" "(unknown name)" 6 "Tobramycin" "PK/PD" 0.5 0.5 FALSE @@ -1685,7 +2745,7 @@ "EUCAST 2020" "MIC" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." 2 2 FALSE "EUCAST 2020" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5" 12 12 FALSE "EUCAST 2020" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE -"EUCAST 2020" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Staphs" 2 2 FALSE "EUCAST 2020" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE "EUCAST 2020" "DISK" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" "5" 13 13 FALSE "EUCAST 2020" "MIC" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" 2 2 FALSE @@ -1715,8 +2775,8 @@ "EUCAST 2019" "MIC" "Haemophilus" 3 "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" "2-1" 19 19 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE -"EUCAST 2019" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2019" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE "EUCAST 2019" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Pneumo" 0.5 1 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 15 FALSE @@ -1725,8 +2785,8 @@ "EUCAST 2019" "MIC" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." 8 16 FALSE "EUCAST 2019" "DISK" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 18 15 FALSE "EUCAST 2019" "MIC" "Pseudomonas" 3 "Amikacin" "Pseudo" 8 16 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" "30" 18 16 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30" 18 16 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30" 22 19 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Amikacin" "PK/PD" 8 16 FALSE @@ -1738,12 +2798,12 @@ "EUCAST 2019" "MIC" "Enterococcus" 3 "Ampicillin" "Enterococcus" 4 8 FALSE "EUCAST 2019" "DISK" "Haemophilus" 3 "Ampicillin" "H. influenzae" "2" 16 16 FALSE "EUCAST 2019" "MIC" "Haemophilus" 3 "Ampicillin" "H. influenzae" 1 1 FALSE -"EUCAST 2019" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" "2" 16 16 FALSE "EUCAST 2019" "MIC" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2019" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" 1 1 FALSE -"EUCAST 2019" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2019" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE "EUCAST 2019" "DISK" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" "2" 22 16 FALSE "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" 0.5 2 FALSE "EUCAST 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2" 21 15 FALSE @@ -1755,16 +2815,16 @@ "EUCAST 2019" "MIC" "Haemophilus" 3 "Amoxicillin" "H. influenzae" 2 2 FALSE "EUCAST 2019" "MIC" "Kingella kingae" 2 "Amoxicillin" "Kingella" 0.125 0.125 FALSE "EUCAST 2019" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE "EUCAST 2019" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Amoxicillin" "Pneumo" 0.5 1 FALSE "EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE -"EUCAST 2019" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2019" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2019" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2019" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2019" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 0.002 4 FALSE -"EUCAST 2019" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2019" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 26 21 FALSE "EUCAST 2019" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2019" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 18 18 FALSE @@ -1777,8 +2837,8 @@ "EUCAST 2019" "MIC" "Streptococcus" 3 "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Azithromycin" "Pneumo" 0.25 0.5 FALSE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Ceftobiprole" "Enterobacteriaceae" 23 23 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" "5" 17 17 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" "5" 17 17 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" 2 2 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Ceftobiprole" "PK/PD" 4 4 FALSE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" "10" 22 19 FALSE "EUCAST 2019" "MIC" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE @@ -1826,20 +2886,20 @@ "EUCAST 2019" "DISK" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" "5" 15 15 TRUE "EUCAST 2019" "MIC" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" 4 4 TRUE "EUCAST 2019" "DISK" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2019" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 28 28 FALSE -"EUCAST 2019" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" "5" 31 31 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE "EUCAST 2019" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE -"EUCAST 2019" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.03 FALSE +"EUCAST 2019" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE "EUCAST 2019" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 26 26 FALSE "EUCAST 2019" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.5 0.5 FALSE -"EUCAST 2019" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2019" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.06 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Ciprofloxacin" "Staphs" "5" 21 21 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Ciprofloxacin" "Staphs" "5" 21 21 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 24 24 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE @@ -1870,11 +2930,11 @@ "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE "EUCAST 2019" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2019" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.03 FALSE -"EUCAST 2019" "DISK" "Pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 20 FALSE -"EUCAST 2019" "DISK" "Non-pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 17 FALSE -"EUCAST 2019" "MIC" "Pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 1 FALSE -"EUCAST 2019" "MIC" "Non-pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2019" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2019" "DISK" "Pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE +"EUCAST 2019" "DISK" "Non-pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 17 FALSE +"EUCAST 2019" "MIC" "Pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2019" "MIC" "Non-pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 2 FALSE "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "Pneumo" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Ceftaroline" "PK/PD" 0.5 0.5 FALSE "EUCAST 2019" "DISK" "Oral" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 25 22 FALSE @@ -1882,7 +2942,7 @@ "EUCAST 2019" "DISK" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" "30" 32 32 FALSE "EUCAST 2019" "MIC" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE "EUCAST 2019" "DISK" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 30 30 FALSE -"EUCAST 2019" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" "30" 24 21 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" 1 2 FALSE "EUCAST 2019" "MIC" "Neisseria gonorrhoeae" 2 "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE @@ -1905,8 +2965,8 @@ "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. catarrhalis" 1 2 FALSE "EUCAST 2019" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2019" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE -"EUCAST 2019" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" 0.032 0.03 FALSE +"EUCAST 2019" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" "Pneumo" 0.5 2 FALSE "EUCAST 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE "EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE @@ -1952,19 +3012,19 @@ "EUCAST 2019" "MIC" "Haemophilus" 3 "Doxycycline" "H. influenzae" 1 2 FALSE "EUCAST 2019" "MIC" "Kingella kingae" 2 "Doxycycline" "Kingella" 0.5 0.5 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. catarrhalis" 1 2 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE "EUCAST 2019" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2019" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Pneumo" 1 2 FALSE "EUCAST 2019" "MIC" "Enterobacterales" 5 "Eravacycline" "Enterobacteriaceae" 0.5 0.5 FALSE "EUCAST 2019" "MIC" "Enterococcus" 3 "Eravacycline" "Enterococcus" 0.125 0.125 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Eravacycline" "Staphs" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Eravacycline" "Staphs" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Eravacycline" "Viridans strept" 0.125 0.125 FALSE "EUCAST 2019" "DISK" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 24 24 FALSE "EUCAST 2019" "MIC" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE -"EUCAST 2019" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE -"EUCAST 2019" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2019" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE +"EUCAST 2019" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE "EUCAST 2019" "MIC" "Haemophilus" 3 "Erythromycin" "H. influenzae" 16 16 FALSE "EUCAST 2019" "DISK" "Kingella kingae" 2 "Erythromycin" "Kingella" 20 20 FALSE "EUCAST 2019" "MIC" "Kingella kingae" 2 "Erythromycin" "Kingella" 0.5 0.5 FALSE @@ -2013,18 +3073,18 @@ "EUCAST 2019" "MIC" "Staphylococcus" 3 "Fosfomycin" "Staphs" 32 32 FALSE "EUCAST 2019" "DISK" "Screen" "Enterobacterales" 5 "Cefoxitin" "Enterobacteriaceae" "30" 19 19 FALSE "EUCAST 2019" "DISK" "Screen" "Staphylococcus" 3 "Cefoxitin" "Staphs" "30" 22 22 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2019" "DISK" "Screen" "Coagulase-negative Staphylococcus (CoNS)" 2 "Cefoxitin" "Staphs" "30" 25 25 FALSE "EUCAST 2019" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2019" "DISK" "Screen" "Staphylococcus pseudintermedius" 2 "Cefoxitin" "Staphs" "30" 20 20 FALSE -"EUCAST 2019" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" 22 22 FALSE -"EUCAST 2019" "MIC" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" 8 8 FALSE +"EUCAST 2019" "DISK" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" 22 22 FALSE +"EUCAST 2019" "MIC" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" 8 8 FALSE "EUCAST 2019" "MIC" "Clostridioides difficile" 2 "Fusidic acid" "C. difficile" 2 1024 FALSE "EUCAST 2019" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE "EUCAST 2019" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2019" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2019" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE -"EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 80 FALSE +"EUCAST 2019" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 14 FALSE "EUCAST 2019" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2019" "DISK" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." "10" 17 17 FALSE @@ -2032,14 +3092,14 @@ "EUCAST 2019" "DISK" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." "10" 23 23 FALSE "EUCAST 2019" "MIC" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2019" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2019" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE +"EUCAST 2019" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE "EUCAST 2019" "DISK" "Pseudomonas" 3 "Gentamicin" "Pseudo" "10" 15 15 FALSE "EUCAST 2019" "MIC" "Pseudomonas" 3 "Gentamicin" "Pseudo" 4 4 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE -"EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 80 FALSE +"EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 2 4 FALSE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" "10" 22 17 FALSE "EUCAST 2019" "MIC" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" 2 4 FALSE @@ -2049,8 +3109,8 @@ "EUCAST 2019" "MIC" "Enterococcus" 3 "Imipenem" "Enterococcus" 4 8 FALSE "EUCAST 2019" "DISK" "Haemophilus" 3 "Imipenem" "H. influenzae" "10" 20 20 FALSE "EUCAST 2019" "MIC" "Haemophilus" 3 "Imipenem" "H. influenzae" 2 2 FALSE -"EUCAST 2019" "DISK" "Morganella morganii morganii" 1 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE -"EUCAST 2019" "MIC" "Morganella morganii morganii" 1 "Imipenem" "Enterobacteriaceae" 0.125 4 FALSE +"EUCAST 2019" "DISK" "Morganella morganii" 2 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE +"EUCAST 2019" "MIC" "Morganella morganii" 2 "Imipenem" "Enterobacteriaceae" 0.125 4 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Imipenem" "M. catarrhalis" "10" 29 29 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Imipenem" "M. catarrhalis" 2 2 FALSE "EUCAST 2019" "DISK" "Proteus" 3 "Imipenem" "Enterobacteriaceae" "10" 50 17 FALSE @@ -2069,12 +3129,12 @@ "EUCAST 2019" "MIC" "Aspergillus fumigatus" 2 "Itraconazole" "Aspergillus" 1 2 FALSE "EUCAST 2019" "MIC" "Aspergillus nidulans" 2 "Itraconazole" "Aspergillus" 1 2 FALSE "EUCAST 2019" "MIC" "Aspergillus terreus" 2 "Itraconazole" "Aspergillus" 1 2 FALSE -"EUCAST 2019" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2019" "MIC" "Candida dubliniensis" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "Candida dubliniensis" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2019" "MIC" "Candida parapsilosis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2019" "MIC" "Candida tropicalis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2019" "MIC" "Staphylococcus" 3 "Kanamycin" "Staphs" 8 8 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Kanamycin" "Staphs" "30" 18 18 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Kanamycin" "Staphs" "30" 18 18 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Kanamycin" "Staphs" 22 22 FALSE "EUCAST 2019" "DISK" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" "30" 14 14 TRUE "EUCAST 2019" "MIC" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" 16 16 TRUE @@ -2100,17 +3160,17 @@ "EUCAST 2019" "MIC" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" 4 4 TRUE "EUCAST 2019" "MIC" "Helicobacter pylori" 2 "Levofloxacin" "H. pylori" 1 1 FALSE "EUCAST 2019" "DISK" "Haemophilus" 3 "Levofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2019" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Kingella kingae" 2 "Levofloxacin" "Kingella" 28 28 FALSE "EUCAST 2019" "MIC" "Kingella kingae" 2 "Levofloxacin" "Kingella" 0.125 0.125 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" "5" 29 29 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE "EUCAST 2019" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 22 22 FALSE "EUCAST 2019" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 1 1 FALSE -"EUCAST 2019" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Levofloxacin" "Staphs" "5" 22 22 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Levofloxacin" "Staphs" "5" 22 22 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Levofloxacin" "Staphs" 1 1 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 24 24 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 1 1 FALSE "EUCAST 2019" "DISK" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" "5" 17 17 FALSE @@ -2130,7 +3190,7 @@ "EUCAST 2019" "MIC" "Non-meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 2 2 FALSE "EUCAST 2019" "MIC" "Meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 0.25 0.25 FALSE "EUCAST 2019" "DISK" "Kingella kingae" 2 "Meropenem" "Kingella" 30 30 FALSE -"EUCAST 2019" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.03 FALSE +"EUCAST 2019" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.032 FALSE "EUCAST 2019" "DISK" "Listeria monocytogenes" 2 "Meropenem" "Listeria monocytogenes" "10" 26 26 FALSE "EUCAST 2019" "MIC" "Listeria monocytogenes" 2 "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Meropenem" "M. catarrhalis" "10" 33 33 FALSE @@ -2154,8 +3214,8 @@ "EUCAST 2019" "MIC" "Haemophilus" 3 "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" "5" 26 26 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Moxifloxacin" "Staphs" "5" 25 25 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Moxifloxacin" "Staphs" "5" 25 25 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 28 28 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE "EUCAST 2019" "DISK" "Streptococcus" 3 "Moxifloxacin" "Strep A, B, C, G" "5" 19 19 FALSE @@ -2163,8 +3223,8 @@ "EUCAST 2019" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" "5" 22 22 FALSE "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE -"EUCAST 2019" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2019" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.015 FALSE +"EUCAST 2019" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2019" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE "EUCAST 2019" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 0.002 2 FALSE "EUCAST 2019" "DISK" "Haemophilus" 3 "Minocycline" "H. influenzae" "30" 24 21 FALSE "EUCAST 2019" "MIC" "Haemophilus" 3 "Minocycline" "H. influenzae" 1 2 FALSE @@ -2181,15 +3241,15 @@ "EUCAST 2019" "MIC" "Helicobacter pylori" 2 "Metronidazole" "H. pylori" 8 8 FALSE "EUCAST 2019" "DISK" "Screen" "Haemophilus" 3 "Nalidixic acid" "H. influenzae" "30" 23 7 FALSE "EUCAST 2019" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. catarrhalis" "30" 23 7 FALSE -"EUCAST 2019" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2019" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" "10" 15 12 FALSE "EUCAST 2019" "MIC" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2019" "DISK" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." "10" 16 16 FALSE "EUCAST 2019" "MIC" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2019" "DISK" "Pseudomonas" 3 "Netilmicin" "Pseudo" "10" 12 12 FALSE "EUCAST 2019" "MIC" "Pseudomonas" 3 "Netilmicin" "Pseudo" 4 4 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Netilmicin" "PK/PD" 2 4 FALSE @@ -2200,7 +3260,7 @@ "EUCAST 2019" "DISK" "UTI" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" "100" 15 15 TRUE "EUCAST 2019" "MIC" "UTI" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" 64 64 TRUE "EUCAST 2019" "MIC" "UTI" "Staphylococcus" 3 "Nitrofurantoin" "Staphs" 64 64 TRUE -"EUCAST 2019" "DISK" "UTI" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE +"EUCAST 2019" "DISK" "UTI" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE "EUCAST 2019" "DISK" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" "100" 15 15 TRUE "EUCAST 2019" "MIC" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE "EUCAST 2019" "DISK" "Enterobacterales" 5 "Norfloxacin" "Enterobacteriaceae" "10" 22 19 FALSE @@ -2215,12 +3275,12 @@ "EUCAST 2019" "DISK" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" "5" 24 22 FALSE "EUCAST 2019" "MIC" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE "EUCAST 2019" "DISK" "Haemophilus" 3 "Ofloxacin" "H. influenzae" "5" 30 30 FALSE -"EUCAST 2019" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" "5" 28 28 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "Neisseria gonorrhoeae" 2 "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Ofloxacin" "Staphs" "5" 20 20 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Ofloxacin" "Staphs" "5" 20 20 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Ofloxacin" "Staphs" 1 1 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ofloxacin" "Staphs" 24 24 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ofloxacin" "Staphs" 1 1 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Ofloxacin" "PK/PD" 0.25 0.5 FALSE @@ -2228,11 +3288,11 @@ "EUCAST 2019" "MIC" "Streptococcus" 3 "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Viridans strept" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Oritavancin" "PK/PD" 0.125 0.125 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "Staphylococcus epidermidis" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Staphs" 2 2 FALSE -"EUCAST 2019" "MIC" "Staphylococcus saprophyticus saprophyticus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "Staphylococcus saprophyticus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2019" "DISK" "Screen" "Streptococcus pneumoniae" 2 "Oxacillin" "Pneumo" "1" 20 7 FALSE "EUCAST 2019" "DISK" "Screen" "Salmonella" 3 "Pefloxacin" "Enterobacteriaceae" "5" 24 24 FALSE "EUCAST 2019" "DISK" "Aerococcus" 3 "Benzylpenicillin" "Aerococcus" 21 21 FALSE @@ -2241,21 +3301,21 @@ "EUCAST 2019" "MIC" "Corynebacterium" 3 "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE "EUCAST 2019" "DISK" "Screen" "Haemophilus" 3 "Benzylpenicillin" "H. influenzae" "1 unit" 12 7 FALSE "EUCAST 2019" "DISK" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 25 25 FALSE -"EUCAST 2019" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.03 FALSE +"EUCAST 2019" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE "EUCAST 2019" "DISK" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE "EUCAST 2019" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2019" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE "EUCAST 2019" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE -"EUCAST 2019" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2019" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE "EUCAST 2019" "MIC" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2019" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE "EUCAST 2019" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2019" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 2 FALSE -"EUCAST 2019" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE "EUCAST 2019" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE "EUCAST 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE @@ -2267,10 +3327,10 @@ "EUCAST 2019" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE "EUCAST 2019" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE "EUCAST 2019" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE -"EUCAST 2019" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2019" "MIC" "Candida dubliniensis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2019" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2019" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "Candida dubliniensis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE "EUCAST 2019" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2019" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE @@ -2320,11 +3380,11 @@ "EUCAST 2019" "DISK" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 28 28 FALSE "EUCAST 2019" "MIC" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE "EUCAST 2019" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2019" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.06 FALSE +"EUCAST 2019" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE "EUCAST 2019" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE -"EUCAST 2019" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2019" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2019" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE "EUCAST 2019" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE "EUCAST 2019" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE "EUCAST 2019" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -2351,7 +3411,7 @@ "EUCAST 2019" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. catarrhalis" 1 2 FALSE "EUCAST 2019" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE "EUCAST 2019" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 1 2 FALSE -"EUCAST 2019" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2019" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE "EUCAST 2019" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE "EUCAST 2019" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2019" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE @@ -2360,7 +3420,7 @@ "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Pneumo" 1 2 FALSE "EUCAST 2019" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30" 16 16 FALSE "EUCAST 2019" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" "Staphs" 2 2 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE "EUCAST 2019" "DISK" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" "30" 15 15 FALSE "EUCAST 2019" "MIC" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE @@ -2390,7 +3450,7 @@ "EUCAST 2019" "MIC" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2019" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" "15" 23 20 FALSE "EUCAST 2019" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" 0.25 0.5 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Staphs" 0.125 0.125 FALSE "EUCAST 2019" "DISK" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5" 18 15 TRUE "EUCAST 2019" "MIC" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE "EUCAST 2019" "DISK" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5" 50 21 TRUE @@ -2404,8 +3464,8 @@ "EUCAST 2019" "MIC" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2019" "DISK" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 16 16 FALSE "EUCAST 2019" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseudo" 4 4 FALSE -"EUCAST 2019" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" "10" 18 18 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2019" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10" 22 22 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2019" "MIC" "(unknown name)" 6 "Tobramycin" "PK/PD" 2 4 FALSE @@ -2426,7 +3486,7 @@ "EUCAST 2019" "MIC" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." 2 2 FALSE "EUCAST 2019" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5" 12 12 FALSE "EUCAST 2019" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE -"EUCAST 2019" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Staphs" 2 2 FALSE "EUCAST 2019" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE "EUCAST 2019" "DISK" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" "5" 13 13 FALSE "EUCAST 2019" "MIC" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" 2 2 FALSE @@ -2456,8 +3516,8 @@ "EUCAST 2018" "DISK" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" "H. influenzae" "2-1" 15 15 FALSE "EUCAST 2018" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" "2-1" 19 19 FALSE "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE -"EUCAST 2018" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2018" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 15 FALSE "EUCAST 2018" "MIC" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" 8 16 FALSE @@ -2465,8 +3525,8 @@ "EUCAST 2018" "MIC" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." 8 16 FALSE "EUCAST 2018" "DISK" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 18 15 FALSE "EUCAST 2018" "MIC" "Pseudomonas" 3 "Amikacin" "Pseudo" 8 16 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" "30" 18 16 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30" 18 16 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30" 22 19 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Amikacin" "PK/PD" 8 16 FALSE @@ -2478,12 +3538,12 @@ "EUCAST 2018" "MIC" "Enterococcus" 3 "Ampicillin" "Enterococcus" 4 8 FALSE "EUCAST 2018" "MIC" "Haemophilus" 3 "Ampicillin" "H. influenzae" 1 1 FALSE "EUCAST 2018" "DISK" "Haemophilus influenzae" 2 "Ampicillin" "H. influenzae" "2" 16 16 FALSE -"EUCAST 2018" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" "2" 16 16 FALSE "EUCAST 2018" "MIC" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2018" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" 1 1 FALSE -"EUCAST 2018" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2018" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" 0.5 2 FALSE "EUCAST 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2" 21 15 FALSE "EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" 0.5 2 FALSE @@ -2494,15 +3554,15 @@ "EUCAST 2018" "MIC" "Haemophilus" 3 "Amoxicillin" "H. influenzae" 2 2 FALSE "EUCAST 2018" "MIC" "Kingella kingae" 2 "Amoxicillin" "Kingella" 0.125 0.125 FALSE "EUCAST 2018" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE "EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE -"EUCAST 2018" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2018" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2018" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2018" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2018" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 0.002 4 FALSE -"EUCAST 2018" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2018" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 26 21 FALSE "EUCAST 2018" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2018" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 50 16 FALSE @@ -2516,8 +3576,8 @@ "EUCAST 2018" "MIC" "Streptococcus" 3 "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Azithromycin" "Pneumo" 0.25 0.5 FALSE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Ceftobiprole" "Enterobacteriaceae" 23 23 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" "5" 17 17 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" "5" 17 17 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" 2 2 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Ceftobiprole" "PK/PD" 4 4 FALSE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" "10" 22 19 FALSE "EUCAST 2018" "MIC" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE @@ -2564,21 +3624,21 @@ "EUCAST 2018" "MIC" "Corynebacterium" 3 "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2018" "DISK" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" "5" 15 15 TRUE "EUCAST 2018" "MIC" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" 4 4 TRUE -"EUCAST 2018" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Haemophilus influenzae" 2 "Ciprofloxacin" "H. influenzae" "5" 30 30 FALSE "EUCAST 2018" "DISK" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 28 28 FALSE -"EUCAST 2018" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" "5" 31 31 FALSE "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE "EUCAST 2018" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE -"EUCAST 2018" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.03 FALSE +"EUCAST 2018" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE "EUCAST 2018" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 26 26 FALSE "EUCAST 2018" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.5 0.5 FALSE -"EUCAST 2018" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2018" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.06 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Ciprofloxacin" "Staphs" "5" 21 21 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Ciprofloxacin" "Staphs" "5" 21 21 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 24 24 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE @@ -2609,11 +3669,11 @@ "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE "EUCAST 2018" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2018" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.03 FALSE -"EUCAST 2018" "DISK" "Pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 20 FALSE -"EUCAST 2018" "DISK" "Non-pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 17 FALSE -"EUCAST 2018" "MIC" "Pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 1 FALSE -"EUCAST 2018" "MIC" "Non-pneumonia" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2018" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2018" "DISK" "Pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE +"EUCAST 2018" "DISK" "Non-pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 17 FALSE +"EUCAST 2018" "MIC" "Pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2018" "MIC" "Non-pneumonia" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 2 FALSE "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "Pneumo" 0.25 0.25 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Ceftaroline" "PK/PD" 0.5 0.5 FALSE "EUCAST 2018" "DISK" "Oral" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 25 22 FALSE @@ -2621,7 +3681,7 @@ "EUCAST 2018" "MIC" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE "EUCAST 2018" "DISK" "Haemophilus influenzae" 2 "Ceftriaxone" "H. influenzae" "30" 31 31 FALSE "EUCAST 2018" "DISK" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 30 30 FALSE -"EUCAST 2018" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" "30" 24 21 FALSE "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" 1 2 FALSE "EUCAST 2018" "MIC" "Neisseria gonorrhoeae" 2 "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE @@ -2644,8 +3704,8 @@ "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. catarrhalis" 1 2 FALSE "EUCAST 2018" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2018" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE -"EUCAST 2018" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" 0.032 0.03 FALSE +"EUCAST 2018" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" "Pneumo" 0.5 2 FALSE "EUCAST 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE "EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE @@ -2704,14 +3764,14 @@ "EUCAST 2018" "MIC" "Haemophilus" 3 "Doxycycline" "H. influenzae" 1 2 FALSE "EUCAST 2018" "MIC" "Kingella kingae" 2 "Doxycycline" "Kingella" 0.5 0.5 FALSE "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. catarrhalis" 1 2 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE "EUCAST 2018" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2018" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Pneumo" 1 2 FALSE "EUCAST 2018" "DISK" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 24 24 FALSE "EUCAST 2018" "MIC" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE -"EUCAST 2018" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE -"EUCAST 2018" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2018" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE +"EUCAST 2018" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE "EUCAST 2018" "MIC" "Haemophilus" 3 "Erythromycin" "H. influenzae" 16 16 FALSE "EUCAST 2018" "DISK" "Kingella kingae" 2 "Erythromycin" "Kingella" 20 20 FALSE "EUCAST 2018" "MIC" "Kingella kingae" 2 "Erythromycin" "Kingella" 0.5 0.5 FALSE @@ -2759,18 +3819,18 @@ "EUCAST 2018" "MIC" "Staphylococcus" 3 "Fosfomycin" "Staphs" 32 32 FALSE "EUCAST 2018" "DISK" "Screen" "Enterobacterales" 5 "Cefoxitin" "Enterobacteriaceae" "30" 19 19 FALSE "EUCAST 2018" "DISK" "Screen" "Staphylococcus" 3 "Cefoxitin" "Staphs" "30" 22 22 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2018" "DISK" "Screen" "Coagulase-negative Staphylococcus (CoNS)" 2 "Cefoxitin" "Staphs" "30" 25 25 FALSE "EUCAST 2018" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2018" "DISK" "Screen" "Staphylococcus pseudintermedius" 2 "Cefoxitin" "Staphs" "30" 20 20 FALSE -"EUCAST 2018" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" 22 22 FALSE -"EUCAST 2018" "MIC" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" 8 8 FALSE +"EUCAST 2018" "DISK" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" 22 22 FALSE +"EUCAST 2018" "MIC" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" 8 8 FALSE "EUCAST 2018" "MIC" "Clostridioides difficile" 2 "Fusidic acid" "C. difficile" 2 1024 FALSE "EUCAST 2018" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE "EUCAST 2018" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2018" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2018" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE -"EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 80 FALSE +"EUCAST 2018" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 14 FALSE "EUCAST 2018" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2018" "DISK" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." "10" 17 17 FALSE @@ -2778,14 +3838,14 @@ "EUCAST 2018" "DISK" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." "10" 23 23 FALSE "EUCAST 2018" "MIC" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2018" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2018" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE +"EUCAST 2018" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE "EUCAST 2018" "DISK" "Pseudomonas" 3 "Gentamicin" "Pseudo" "10" 15 15 FALSE "EUCAST 2018" "MIC" "Pseudomonas" 3 "Gentamicin" "Pseudo" 4 4 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE -"EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 80 FALSE +"EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 2 4 FALSE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" "10" 22 16 FALSE "EUCAST 2018" "MIC" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" 2 8 FALSE @@ -2802,11 +3862,11 @@ "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Pneumo" 2 2 FALSE "EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Imipenem" "Viridans strept" 2 2 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Imipenem" "PK/PD" 2 8 FALSE -"EUCAST 2018" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2018" "MIC" "Candida parapsilosis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2018" "MIC" "Candida tropicalis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2018" "MIC" "Staphylococcus" 3 "Kanamycin" "Staphs" 8 8 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Kanamycin" "Staphs" "30" 18 18 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Kanamycin" "Staphs" "30" 18 18 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Kanamycin" "Staphs" 22 22 FALSE "EUCAST 2018" "DISK" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" "30" 14 14 TRUE "EUCAST 2018" "MIC" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" 16 16 TRUE @@ -2831,7 +3891,7 @@ "EUCAST 2018" "DISK" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" "5" 15 15 TRUE "EUCAST 2018" "MIC" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" 4 4 TRUE "EUCAST 2018" "MIC" "Helicobacter pylori" 2 "Levofloxacin" "H. pylori" 1 1 FALSE -"EUCAST 2018" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Haemophilus influenzae" 2 "Levofloxacin" "H. influenzae" "5" 30 30 FALSE "EUCAST 2018" "DISK" "Kingella kingae" 2 "Levofloxacin" "Kingella" 28 28 FALSE "EUCAST 2018" "MIC" "Kingella kingae" 2 "Levofloxacin" "Kingella" 0.125 0.125 FALSE @@ -2839,10 +3899,10 @@ "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE "EUCAST 2018" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 22 22 FALSE "EUCAST 2018" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 1 1 FALSE -"EUCAST 2018" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Levofloxacin" "Staphs" "5" 22 22 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Levofloxacin" "Staphs" "5" 22 22 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Levofloxacin" "Staphs" 1 1 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 24 24 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 1 1 FALSE "EUCAST 2018" "DISK" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" "5" 17 17 FALSE @@ -2862,7 +3922,7 @@ "EUCAST 2018" "MIC" "Meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 0.25 1 FALSE "EUCAST 2018" "DISK" "Non-meningitis" "Haemophilus influenzae" 2 "Meropenem" "H. influenzae" "10" 20 20 FALSE "EUCAST 2018" "DISK" "Kingella kingae" 2 "Meropenem" "Kingella" 30 30 FALSE -"EUCAST 2018" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.03 FALSE +"EUCAST 2018" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.032 FALSE "EUCAST 2018" "DISK" "Listeria monocytogenes" 2 "Meropenem" "Listeria monocytogenes" "10" 26 26 FALSE "EUCAST 2018" "MIC" "Listeria monocytogenes" 2 "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE "EUCAST 2018" "DISK" "Moraxella catarrhalis" 2 "Meropenem" "M. catarrhalis" "10" 33 33 FALSE @@ -2883,8 +3943,8 @@ "EUCAST 2018" "DISK" "Haemophilus influenzae" 2 "Moxifloxacin" "H. influenzae" "5" 28 28 FALSE "EUCAST 2018" "DISK" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" "5" 26 26 FALSE "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Moxifloxacin" "Staphs" "5" 25 25 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Moxifloxacin" "Staphs" "5" 25 25 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 28 28 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE "EUCAST 2018" "DISK" "Streptococcus" 3 "Moxifloxacin" "Strep A, B, C, G" "5" 19 19 FALSE @@ -2892,8 +3952,8 @@ "EUCAST 2018" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" "5" 22 22 FALSE "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE -"EUCAST 2018" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2018" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.015 FALSE +"EUCAST 2018" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2018" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE "EUCAST 2018" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 0.002 2 FALSE "EUCAST 2018" "MIC" "Haemophilus" 3 "Minocycline" "H. influenzae" 1 2 FALSE "EUCAST 2018" "DISK" "Haemophilus influenzae" 2 "Minocycline" "H. influenzae" "30" 24 21 FALSE @@ -2910,15 +3970,15 @@ "EUCAST 2018" "MIC" "Helicobacter pylori" 2 "Metronidazole" "H. pylori" 8 8 FALSE "EUCAST 2018" "DISK" "Screen" "Haemophilus influenzae" 2 "Nalidixic acid" "H. influenzae" "30" 23 7 FALSE "EUCAST 2018" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. catarrhalis" "30" 23 7 FALSE -"EUCAST 2018" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2018" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" "10" 15 12 FALSE "EUCAST 2018" "MIC" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2018" "DISK" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." "10" 16 16 FALSE "EUCAST 2018" "MIC" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2018" "DISK" "Pseudomonas" 3 "Netilmicin" "Pseudo" "10" 12 12 FALSE "EUCAST 2018" "MIC" "Pseudomonas" 3 "Netilmicin" "Pseudo" 4 4 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Netilmicin" "PK/PD" 2 4 FALSE @@ -2929,7 +3989,7 @@ "EUCAST 2018" "DISK" "UTI" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" "100" 15 15 TRUE "EUCAST 2018" "MIC" "UTI" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" 64 64 TRUE "EUCAST 2018" "MIC" "UTI" "Staphylococcus" 3 "Nitrofurantoin" "Staphs" 64 64 TRUE -"EUCAST 2018" "DISK" "UTI" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE +"EUCAST 2018" "DISK" "UTI" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE "EUCAST 2018" "DISK" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" "100" 15 15 TRUE "EUCAST 2018" "MIC" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Norfloxacin" "Enterobacteriaceae" "10" 22 19 FALSE @@ -2943,13 +4003,13 @@ "EUCAST 2018" "MIC" "UTI" "Enterobacterales" 5 "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE "EUCAST 2018" "DISK" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" "5" 24 22 FALSE "EUCAST 2018" "MIC" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE -"EUCAST 2018" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Haemophilus influenzae" 2 "Ofloxacin" "H. influenzae" "5" 30 30 FALSE "EUCAST 2018" "DISK" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" "5" 28 28 FALSE "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE "EUCAST 2018" "MIC" "Neisseria gonorrhoeae" 2 "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Ofloxacin" "Staphs" "5" 20 20 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Ofloxacin" "Staphs" "5" 20 20 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Ofloxacin" "Staphs" 1 1 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ofloxacin" "Staphs" 24 24 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ofloxacin" "Staphs" 1 1 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Ofloxacin" "PK/PD" 0.25 0.5 FALSE @@ -2957,11 +4017,11 @@ "EUCAST 2018" "MIC" "Streptococcus" 3 "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Viridans strept" 0.25 0.25 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Oritavancin" "PK/PD" 0.125 0.125 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2018" "MIC" "Staphylococcus epidermidis" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2018" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Staphs" 2 2 FALSE -"EUCAST 2018" "MIC" "Staphylococcus saprophyticus saprophyticus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "Staphylococcus saprophyticus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2018" "DISK" "Screen" "Streptococcus pneumoniae" 2 "Oxacillin" "Pneumo" "1" 20 7 FALSE "EUCAST 2018" "DISK" "Screen" "Salmonella" 3 "Pefloxacin" "Enterobacteriaceae" "5" 24 24 FALSE "EUCAST 2018" "DISK" "Aerococcus" 3 "Benzylpenicillin" "Aerococcus" 21 21 FALSE @@ -2970,21 +4030,21 @@ "EUCAST 2018" "MIC" "Corynebacterium" 3 "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE "EUCAST 2018" "DISK" "Screen" "Haemophilus influenzae" 2 "Benzylpenicillin" "H. influenzae" "1 unit" 12 7 FALSE "EUCAST 2018" "DISK" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 25 25 FALSE -"EUCAST 2018" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.03 FALSE +"EUCAST 2018" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE "EUCAST 2018" "DISK" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE "EUCAST 2018" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2018" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE "EUCAST 2018" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE -"EUCAST 2018" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2018" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE "EUCAST 2018" "MIC" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2018" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE "EUCAST 2018" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2018" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 2 FALSE -"EUCAST 2018" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE "EUCAST 2018" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE "EUCAST 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE @@ -2996,9 +4056,9 @@ "EUCAST 2018" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE "EUCAST 2018" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.125 FALSE "EUCAST 2018" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE -"EUCAST 2018" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2018" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2018" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE "EUCAST 2018" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2018" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE @@ -3048,11 +4108,11 @@ "EUCAST 2018" "DISK" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 28 28 FALSE "EUCAST 2018" "MIC" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE "EUCAST 2018" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2018" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.06 FALSE +"EUCAST 2018" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE "EUCAST 2018" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE -"EUCAST 2018" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2018" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2018" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE "EUCAST 2018" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE "EUCAST 2018" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE "EUCAST 2018" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -3079,7 +4139,7 @@ "EUCAST 2018" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. catarrhalis" 1 2 FALSE "EUCAST 2018" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE "EUCAST 2018" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 1 2 FALSE -"EUCAST 2018" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2018" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE "EUCAST 2018" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE "EUCAST 2018" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2018" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE @@ -3088,7 +4148,7 @@ "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Pneumo" 1 2 FALSE "EUCAST 2018" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30" 16 16 FALSE "EUCAST 2018" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" "Staphs" 2 2 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE "EUCAST 2018" "DISK" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" "30" 15 15 FALSE "EUCAST 2018" "MIC" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE @@ -3118,7 +4178,7 @@ "EUCAST 2018" "MIC" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2018" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" "15" 23 20 FALSE "EUCAST 2018" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" 0.25 0.5 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Staphs" 0.125 0.125 FALSE "EUCAST 2018" "DISK" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5" 18 15 TRUE "EUCAST 2018" "MIC" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE "EUCAST 2018" "DISK" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5" 50 21 TRUE @@ -3132,8 +4192,8 @@ "EUCAST 2018" "MIC" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2018" "DISK" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 16 16 FALSE "EUCAST 2018" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseudo" 4 4 FALSE -"EUCAST 2018" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" "10" 18 18 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2018" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10" 22 22 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2018" "MIC" "(unknown name)" 6 "Tobramycin" "PK/PD" 2 4 FALSE @@ -3152,7 +4212,7 @@ "EUCAST 2018" "MIC" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." 2 2 FALSE "EUCAST 2018" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5" 12 12 FALSE "EUCAST 2018" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE -"EUCAST 2018" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Staphs" 2 2 FALSE "EUCAST 2018" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE "EUCAST 2018" "DISK" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" "5" 13 13 FALSE "EUCAST 2018" "MIC" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" 2 2 FALSE @@ -3181,8 +4241,8 @@ "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" "H. influenzae" "2-1" 15 15 FALSE "EUCAST 2017" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" "2-1" 19 19 FALSE "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE -"EUCAST 2017" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2017" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 15 FALSE "EUCAST 2017" "MIC" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" 8 16 FALSE @@ -3190,8 +4250,8 @@ "EUCAST 2017" "MIC" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." 8 16 FALSE "EUCAST 2017" "DISK" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 18 15 FALSE "EUCAST 2017" "MIC" "Pseudomonas" 3 "Amikacin" "Pseudo" 8 16 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" "30" 18 16 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30" 18 16 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30" 22 19 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Amikacin" "PK/PD" 8 16 FALSE @@ -3203,12 +4263,12 @@ "EUCAST 2017" "MIC" "Enterococcus" 3 "Ampicillin" "Enterococcus" 4 8 FALSE "EUCAST 2017" "MIC" "Haemophilus" 3 "Ampicillin" "H. influenzae" 1 1 FALSE "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Ampicillin" "H. influenzae" "2" 16 16 FALSE -"EUCAST 2017" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Kingella kingae" 2 "Ampicillin" "Kingella" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" "2" 16 16 FALSE "EUCAST 2017" "MIC" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2017" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" 1 1 FALSE -"EUCAST 2017" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2017" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" 0.5 2 FALSE "EUCAST 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2" 21 15 FALSE "EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" 0.5 2 FALSE @@ -3219,15 +4279,15 @@ "EUCAST 2017" "MIC" "Haemophilus" 3 "Amoxicillin" "H. influenzae" 2 2 FALSE "EUCAST 2017" "MIC" "Kingella kingae" 2 "Amoxicillin" "Kingella" 0.125 0.125 FALSE "EUCAST 2017" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE "EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE -"EUCAST 2017" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2017" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2017" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2017" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2017" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 0.002 4 FALSE -"EUCAST 2017" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2017" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 26 21 FALSE "EUCAST 2017" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2017" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 50 16 FALSE @@ -3241,8 +4301,8 @@ "EUCAST 2017" "MIC" "Streptococcus" 3 "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Azithromycin" "Pneumo" 0.25 0.5 FALSE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Ceftobiprole" "Enterobacteriaceae" 23 23 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" "5" 17 17 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" "5" 17 17 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" 2 2 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Ceftobiprole" "PK/PD" 4 4 FALSE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" "10" 22 19 FALSE "EUCAST 2017" "MIC" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE @@ -3285,21 +4345,21 @@ "EUCAST 2017" "MIC" "Corynebacterium" 3 "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2017" "DISK" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" "5" 15 15 TRUE "EUCAST 2017" "MIC" "UTI" "Enterococcus" 3 "Ciprofloxacin" "Enterococcus" 4 4 TRUE -"EUCAST 2017" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Haemophilus" 3 "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Ciprofloxacin" "H. influenzae" "5" 30 30 FALSE "EUCAST 2017" "DISK" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 28 28 FALSE -"EUCAST 2017" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Kingella kingae" 2 "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" "5" 26 26 FALSE "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" 0.5 0.5 FALSE "EUCAST 2017" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE -"EUCAST 2017" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.03 FALSE +"EUCAST 2017" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE "EUCAST 2017" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 26 26 FALSE "EUCAST 2017" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.5 0.5 FALSE -"EUCAST 2017" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2017" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.06 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Ciprofloxacin" "Staphs" "5" 21 21 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Ciprofloxacin" "Staphs" "5" 21 21 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 24 24 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE @@ -3330,9 +4390,9 @@ "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE "EUCAST 2017" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2017" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.03 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 20 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2017" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 1 FALSE "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "Pneumo" 0.25 0.25 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Ceftaroline" "PK/PD" 0.5 0.5 FALSE "EUCAST 2017" "DISK" "Oral" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 25 22 FALSE @@ -3340,7 +4400,7 @@ "EUCAST 2017" "MIC" "Haemophilus" 3 "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Ceftriaxone" "H. influenzae" "30" 31 31 FALSE "EUCAST 2017" "DISK" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 30 30 FALSE -"EUCAST 2017" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Kingella kingae" 2 "Ceftriaxone" "Kingella" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" "30" 24 21 FALSE "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Ceftriaxone" "M. catarrhalis" 1 2 FALSE "EUCAST 2017" "MIC" "Neisseria gonorrhoeae" 2 "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE @@ -3363,8 +4423,8 @@ "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. catarrhalis" 1 2 FALSE "EUCAST 2017" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2017" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE -"EUCAST 2017" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" 0.032 0.03 FALSE +"EUCAST 2017" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" "Pneumo" 0.5 2 FALSE "EUCAST 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE "EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE @@ -3422,14 +4482,14 @@ "EUCAST 2017" "MIC" "Haemophilus" 3 "Doxycycline" "H. influenzae" 1 2 FALSE "EUCAST 2017" "MIC" "Kingella kingae" 2 "Doxycycline" "Kingella" 0.5 0.5 FALSE "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. catarrhalis" 1 2 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE "EUCAST 2017" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2017" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Pneumo" 1 2 FALSE "EUCAST 2017" "DISK" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 24 24 FALSE "EUCAST 2017" "MIC" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE -"EUCAST 2017" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE -"EUCAST 2017" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2017" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE +"EUCAST 2017" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE "EUCAST 2017" "MIC" "Haemophilus" 3 "Erythromycin" "H. influenzae" 0.5 16 FALSE "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Erythromycin" "H. influenzae" "15" 50 10 FALSE "EUCAST 2017" "DISK" "Kingella kingae" 2 "Erythromycin" "Kingella" 20 20 FALSE @@ -3476,18 +4536,18 @@ "EUCAST 2017" "MIC" "Staphylococcus" 3 "Fosfomycin" "Staphs" 32 32 FALSE "EUCAST 2017" "DISK" "Screen" "Enterobacterales" 5 "Cefoxitin" "Enterobacteriaceae" "30" 19 19 FALSE "EUCAST 2017" "DISK" "Screen" "Staphylococcus" 3 "Cefoxitin" "Staphs" "30" 22 22 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2017" "DISK" "Screen" "Coagulase-negative Staphylococcus (CoNS)" 2 "Cefoxitin" "Staphs" "30" 25 25 FALSE "EUCAST 2017" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2017" "DISK" "Screen" "Staphylococcus pseudintermedius" 2 "Cefoxitin" "Staphs" "30" 20 20 FALSE -"EUCAST 2017" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" 22 22 FALSE -"EUCAST 2017" "MIC" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" 8 8 FALSE +"EUCAST 2017" "DISK" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" 22 22 FALSE +"EUCAST 2017" "MIC" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" 8 8 FALSE "EUCAST 2017" "MIC" "Clostridioides difficile" 2 "Fusidic acid" "C. difficile" 2 1024 FALSE "EUCAST 2017" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE "EUCAST 2017" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2017" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2017" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE -"EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 80 FALSE +"EUCAST 2017" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 14 FALSE "EUCAST 2017" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2017" "DISK" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." "10" 17 17 FALSE @@ -3495,14 +4555,14 @@ "EUCAST 2017" "DISK" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." "10" 23 23 FALSE "EUCAST 2017" "MIC" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2017" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2017" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE +"EUCAST 2017" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE "EUCAST 2017" "DISK" "Pseudomonas" 3 "Gentamicin" "Pseudo" "10" 15 15 FALSE "EUCAST 2017" "MIC" "Pseudomonas" 3 "Gentamicin" "Pseudo" 4 4 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE -"EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 80 FALSE +"EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 2 4 FALSE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" "10" 22 16 FALSE "EUCAST 2017" "MIC" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" 2 8 FALSE @@ -3519,11 +4579,11 @@ "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Pneumo" 2 2 FALSE "EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Imipenem" "Viridans strept" 2 2 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Imipenem" "PK/PD" 2 8 FALSE -"EUCAST 2017" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2017" "MIC" "Candida parapsilosis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2017" "MIC" "Candida tropicalis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2017" "MIC" "Staphylococcus" 3 "Kanamycin" "Staphs" 8 8 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Kanamycin" "Staphs" "30" 18 18 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Kanamycin" "Staphs" "30" 18 18 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Kanamycin" "Staphs" 22 22 FALSE "EUCAST 2017" "DISK" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" "30" 14 14 TRUE "EUCAST 2017" "MIC" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" 16 16 TRUE @@ -3546,7 +4606,7 @@ "EUCAST 2017" "DISK" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" "5" 15 15 TRUE "EUCAST 2017" "MIC" "UTI" "Enterococcus" 3 "Levofloxacin" "Enterococcus" 4 4 TRUE "EUCAST 2017" "MIC" "Helicobacter pylori" 2 "Levofloxacin" "H. pylori" 1 1 FALSE -"EUCAST 2017" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Haemophilus" 3 "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Levofloxacin" "H. influenzae" "5" 30 30 FALSE "EUCAST 2017" "DISK" "Kingella kingae" 2 "Levofloxacin" "Kingella" 28 28 FALSE "EUCAST 2017" "MIC" "Kingella kingae" 2 "Levofloxacin" "Kingella" 0.125 0.125 FALSE @@ -3554,10 +4614,10 @@ "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" 1 1 FALSE "EUCAST 2017" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 22 22 FALSE "EUCAST 2017" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 1 1 FALSE -"EUCAST 2017" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Levofloxacin" "Staphs" "5" 22 22 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Levofloxacin" "Staphs" "5" 22 22 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Levofloxacin" "Staphs" 1 1 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 24 24 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Levofloxacin" "Staphs" 1 1 FALSE "EUCAST 2017" "DISK" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" "5" 17 17 FALSE @@ -3577,7 +4637,7 @@ "EUCAST 2017" "MIC" "Meningitis" "Haemophilus" 3 "Meropenem" "H. influenzae" 0.25 1 FALSE "EUCAST 2017" "DISK" "Non-meningitis" "Haemophilus influenzae" 2 "Meropenem" "H. influenzae" "10" 20 20 FALSE "EUCAST 2017" "DISK" "Kingella kingae" 2 "Meropenem" "Kingella" 30 30 FALSE -"EUCAST 2017" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.03 FALSE +"EUCAST 2017" "MIC" "Kingella kingae" 2 "Meropenem" "Kingella" 0.032 0.032 FALSE "EUCAST 2017" "DISK" "Listeria monocytogenes" 2 "Meropenem" "Listeria monocytogenes" "10" 26 26 FALSE "EUCAST 2017" "MIC" "Listeria monocytogenes" 2 "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE "EUCAST 2017" "DISK" "Moraxella catarrhalis" 2 "Meropenem" "M. catarrhalis" "10" 33 33 FALSE @@ -3598,8 +4658,8 @@ "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Moxifloxacin" "H. influenzae" "5" 28 28 FALSE "EUCAST 2017" "DISK" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" "5" 23 23 FALSE "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Moxifloxacin" "M. catarrhalis" 0.5 0.5 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Moxifloxacin" "Staphs" "5" 25 25 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Moxifloxacin" "Staphs" "5" 25 25 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 28 28 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Moxifloxacin" "Staphs" 0.25 0.25 FALSE "EUCAST 2017" "DISK" "Streptococcus" 3 "Moxifloxacin" "Strep A, B, C, G" "5" 19 19 FALSE @@ -3607,8 +4667,8 @@ "EUCAST 2017" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" "5" 22 22 FALSE "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE -"EUCAST 2017" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2017" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.015 FALSE +"EUCAST 2017" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2017" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE "EUCAST 2017" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 0.002 2 FALSE "EUCAST 2017" "MIC" "Haemophilus" 3 "Minocycline" "H. influenzae" 1 2 FALSE "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Minocycline" "H. influenzae" "30" 24 21 FALSE @@ -3625,15 +4685,15 @@ "EUCAST 2017" "MIC" "Helicobacter pylori" 2 "Metronidazole" "H. pylori" 8 8 FALSE "EUCAST 2017" "DISK" "Screen" "Haemophilus influenzae" 2 "Nalidixic acid" "H. influenzae" "30" 23 7 FALSE "EUCAST 2017" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. catarrhalis" "30" 23 7 FALSE -"EUCAST 2017" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2017" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" "10" 15 12 FALSE "EUCAST 2017" "MIC" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2017" "DISK" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." "10" 16 16 FALSE "EUCAST 2017" "MIC" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2017" "DISK" "Pseudomonas" 3 "Netilmicin" "Pseudo" "10" 12 12 FALSE "EUCAST 2017" "MIC" "Pseudomonas" 3 "Netilmicin" "Pseudo" 4 4 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Netilmicin" "PK/PD" 2 4 FALSE @@ -3644,7 +4704,7 @@ "EUCAST 2017" "DISK" "UTI" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" "100" 15 15 TRUE "EUCAST 2017" "MIC" "UTI" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" 64 64 TRUE "EUCAST 2017" "MIC" "UTI" "Staphylococcus" 3 "Nitrofurantoin" "Staphs" 64 64 TRUE -"EUCAST 2017" "DISK" "UTI" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE +"EUCAST 2017" "DISK" "UTI" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "Staphs" "100" 13 13 TRUE "EUCAST 2017" "DISK" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" "100" 15 15 TRUE "EUCAST 2017" "MIC" "UTI" "Streptococcus group B" 2 "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Norfloxacin" "Enterobacteriaceae" "10" 22 19 FALSE @@ -3658,13 +4718,13 @@ "EUCAST 2017" "MIC" "UTI" "Enterobacterales" 5 "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE "EUCAST 2017" "DISK" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" "5" 24 22 FALSE "EUCAST 2017" "MIC" "Enterobacterales" 5 "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE -"EUCAST 2017" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Haemophilus" 3 "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Haemophilus influenzae" 2 "Ofloxacin" "H. influenzae" "5" 30 30 FALSE "EUCAST 2017" "DISK" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" "5" 25 25 FALSE "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Ofloxacin" "M. catarrhalis" 0.5 0.5 FALSE "EUCAST 2017" "MIC" "Neisseria gonorrhoeae" 2 "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Ofloxacin" "Staphs" "5" 20 20 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Ofloxacin" "Staphs" "5" 20 20 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Ofloxacin" "Staphs" 1 1 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ofloxacin" "Staphs" 24 24 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Ofloxacin" "Staphs" 1 1 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Ofloxacin" "PK/PD" 0.25 0.5 FALSE @@ -3672,11 +4732,11 @@ "EUCAST 2017" "MIC" "Streptococcus" 3 "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Viridans strept" 0.25 0.25 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Oritavancin" "PK/PD" 0.125 0.125 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2017" "MIC" "Staphylococcus epidermidis" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2017" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Staphs" 2 2 FALSE -"EUCAST 2017" "MIC" "Staphylococcus saprophyticus saprophyticus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "Staphylococcus saprophyticus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2017" "DISK" "Screen" "Streptococcus pneumoniae" 2 "Oxacillin" "Pneumo" "1" 20 7 FALSE "EUCAST 2017" "DISK" "Screen" "Salmonella" 3 "Pefloxacin" "Enterobacteriaceae" "5" 24 24 FALSE "EUCAST 2017" "DISK" "Aerococcus" 3 "Benzylpenicillin" "Aerococcus" 21 21 FALSE @@ -3685,21 +4745,21 @@ "EUCAST 2017" "MIC" "Corynebacterium" 3 "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE "EUCAST 2017" "DISK" "Screen" "Haemophilus influenzae" 2 "Benzylpenicillin" "H. influenzae" "1 unit" 12 7 FALSE "EUCAST 2017" "DISK" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 25 25 FALSE -"EUCAST 2017" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.03 FALSE +"EUCAST 2017" "MIC" "Kingella kingae" 2 "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE "EUCAST 2017" "DISK" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE "EUCAST 2017" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2017" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE "EUCAST 2017" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE -"EUCAST 2017" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2017" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE "EUCAST 2017" "MIC" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2017" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE "EUCAST 2017" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2017" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 2 FALSE -"EUCAST 2017" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE "EUCAST 2017" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE "EUCAST 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE @@ -3711,9 +4771,9 @@ "EUCAST 2017" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE "EUCAST 2017" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.125 FALSE "EUCAST 2017" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE -"EUCAST 2017" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2017" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2017" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE "EUCAST 2017" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2017" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE @@ -3762,11 +4822,11 @@ "EUCAST 2017" "DISK" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 28 28 FALSE "EUCAST 2017" "MIC" "Kingella kingae" 2 "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE "EUCAST 2017" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2017" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.06 FALSE +"EUCAST 2017" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE "EUCAST 2017" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE -"EUCAST 2017" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2017" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2017" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE "EUCAST 2017" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE "EUCAST 2017" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE "EUCAST 2017" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -3793,7 +4853,7 @@ "EUCAST 2017" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. catarrhalis" 1 2 FALSE "EUCAST 2017" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE "EUCAST 2017" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 1 2 FALSE -"EUCAST 2017" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2017" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE "EUCAST 2017" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE "EUCAST 2017" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2017" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE @@ -3802,7 +4862,7 @@ "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Pneumo" 1 2 FALSE "EUCAST 2017" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30" 16 16 FALSE "EUCAST 2017" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" "Staphs" 2 2 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE "EUCAST 2017" "DISK" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" "30" 15 15 FALSE "EUCAST 2017" "MIC" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE @@ -3833,7 +4893,7 @@ "EUCAST 2017" "MIC" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2017" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" "15" 23 20 FALSE "EUCAST 2017" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" 0.25 0.5 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Staphs" 0.125 0.125 FALSE "EUCAST 2017" "DISK" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5" 18 15 TRUE "EUCAST 2017" "MIC" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE "EUCAST 2017" "DISK" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5" 50 21 TRUE @@ -3847,8 +4907,8 @@ "EUCAST 2017" "MIC" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2017" "DISK" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 16 16 FALSE "EUCAST 2017" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseudo" 4 4 FALSE -"EUCAST 2017" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" "10" 18 18 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2017" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10" 22 22 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2017" "MIC" "(unknown name)" 6 "Tobramycin" "PK/PD" 2 4 FALSE @@ -3867,7 +4927,7 @@ "EUCAST 2017" "MIC" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." 2 2 FALSE "EUCAST 2017" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5" 12 12 FALSE "EUCAST 2017" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE -"EUCAST 2017" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Staphs" 2 2 FALSE "EUCAST 2017" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE "EUCAST 2017" "DISK" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" "5" 13 13 FALSE "EUCAST 2017" "MIC" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" 2 2 FALSE @@ -3896,8 +4956,8 @@ "EUCAST 2016" "DISK" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" "H. influenzae" "2-1" 15 15 FALSE "EUCAST 2016" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" "2-1" 19 19 FALSE "EUCAST 2016" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE -"EUCAST 2016" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2016" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE "EUCAST 2016" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 15 FALSE "EUCAST 2016" "MIC" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" 8 16 FALSE @@ -3905,8 +4965,8 @@ "EUCAST 2016" "MIC" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." 8 16 FALSE "EUCAST 2016" "DISK" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 18 15 FALSE "EUCAST 2016" "MIC" "Pseudomonas" 3 "Amikacin" "Pseudo" 8 16 FALSE -"EUCAST 2016" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" "30" 18 16 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2016" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30" 18 16 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2016" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30" 22 19 FALSE "EUCAST 2016" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Amikacin" "PK/PD" 8 16 FALSE @@ -3919,9 +4979,9 @@ "EUCAST 2016" "DISK" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" "2" 16 16 FALSE "EUCAST 2016" "MIC" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2016" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2016" "DISK" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" "2" 17 17 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" 1 1 FALSE -"EUCAST 2016" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2016" "DISK" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" "2" 17 17 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2016" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" 0.5 2 FALSE "EUCAST 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2" 21 15 FALSE "EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" 0.5 2 FALSE @@ -3931,15 +4991,15 @@ "EUCAST 2016" "MIC" "Helicobacter pylori" 2 "Amoxicillin" "H. pylori" 0.125 0.125 FALSE "EUCAST 2016" "MIC" "Haemophilus" 3 "Amoxicillin" "H. influenzae" 2 2 FALSE "EUCAST 2016" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE "EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE -"EUCAST 2016" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2016" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2016" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2016" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2016" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2016" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 0.002 4 FALSE -"EUCAST 2016" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2016" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2016" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2016" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 24 21 FALSE "EUCAST 2016" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2016" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 50 16 FALSE @@ -3952,8 +5012,8 @@ "EUCAST 2016" "MIC" "Streptococcus" 3 "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Azithromycin" "Pneumo" 0.25 0.5 FALSE "EUCAST 2016" "DISK" "Enterobacterales" 5 "Ceftobiprole" "Enterobacteriaceae" 23 23 FALSE -"EUCAST 2016" "DISK" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" "5" 17 17 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2016" "DISK" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" "5" 17 17 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Ceftobiprole" "Staphs" 2 2 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Ceftobiprole" "PK/PD" 4 4 FALSE "EUCAST 2016" "DISK" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" "10" 22 19 FALSE "EUCAST 2016" "MIC" "Enterobacterales" 5 "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE @@ -3999,12 +5059,12 @@ "EUCAST 2016" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" "5" 26 26 FALSE "EUCAST 2016" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. catarrhalis" 0.5 0.5 FALSE "EUCAST 2016" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE -"EUCAST 2016" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.03 FALSE +"EUCAST 2016" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE "EUCAST 2016" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 25 22 FALSE "EUCAST 2016" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.5 1 FALSE -"EUCAST 2016" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2016" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.06 FALSE +"EUCAST 2016" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE "EUCAST 2016" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Staphs" "5" 20 20 FALSE "EUCAST 2016" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2016" "DISK" "Streptococcus pneumoniae" 2 "Ciprofloxacin" "Pneumo" "5" 50 16 FALSE @@ -4036,9 +5096,9 @@ "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE "EUCAST 2016" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE "EUCAST 2016" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2016" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.03 FALSE -"EUCAST 2016" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 20 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2016" "MIC" "Haemophilus" 3 "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2016" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 1 FALSE "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "Pneumo" 0.25 0.25 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Ceftaroline" "PK/PD" 0.5 0.5 FALSE "EUCAST 2016" "DISK" "Oral" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 23 20 FALSE @@ -4065,8 +5125,8 @@ "EUCAST 2016" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. catarrhalis" 1 2 FALSE "EUCAST 2016" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2016" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE -"EUCAST 2016" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" 0.032 0.03 FALSE +"EUCAST 2016" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" "Pneumo" 0.5 2 FALSE "EUCAST 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE "EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE @@ -4115,14 +5175,14 @@ "EUCAST 2016" "MIC" "(unknown name)" 6 "Doripenem" "PK/PD" 1 2 FALSE "EUCAST 2016" "MIC" "Haemophilus" 3 "Doxycycline" "H. influenzae" 1 2 FALSE "EUCAST 2016" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. catarrhalis" 1 2 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE "EUCAST 2016" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2016" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Pneumo" 1 2 FALSE "EUCAST 2016" "DISK" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 24 24 FALSE "EUCAST 2016" "MIC" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE -"EUCAST 2016" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE -"EUCAST 2016" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2016" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE +"EUCAST 2016" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE "EUCAST 2016" "MIC" "Haemophilus" 3 "Erythromycin" "H. influenzae" 0.5 16 FALSE "EUCAST 2016" "DISK" "Haemophilus influenzae" 2 "Erythromycin" "H. influenzae" "15" 50 10 FALSE "EUCAST 2016" "DISK" "Listeria monocytogenes" 2 "Erythromycin" "Listeria monocytogenes" "15" 25 25 FALSE @@ -4171,8 +5231,8 @@ "EUCAST 2016" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE "EUCAST 2016" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2016" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2016" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE -"EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 80 FALSE +"EUCAST 2016" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE "EUCAST 2016" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 14 FALSE "EUCAST 2016" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2016" "DISK" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." "10" 17 17 FALSE @@ -4180,14 +5240,14 @@ "EUCAST 2016" "DISK" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." "10" 23 23 FALSE "EUCAST 2016" "MIC" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2016" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2016" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE +"EUCAST 2016" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE "EUCAST 2016" "DISK" "Pseudomonas" 3 "Gentamicin" "Pseudo" "10" 15 15 FALSE "EUCAST 2016" "MIC" "Pseudomonas" 3 "Gentamicin" "Pseudo" 4 4 FALSE -"EUCAST 2016" "DISK" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2016" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE "EUCAST 2016" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE -"EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 80 FALSE +"EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 2 4 FALSE "EUCAST 2016" "DISK" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" "10" 22 16 FALSE "EUCAST 2016" "MIC" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" 2 8 FALSE @@ -4204,7 +5264,7 @@ "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Pneumo" 2 2 FALSE "EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Imipenem" "Viridans strept" 2 2 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Imipenem" "PK/PD" 2 8 FALSE -"EUCAST 2016" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2016" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2016" "MIC" "Candida parapsilosis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2016" "MIC" "Candida tropicalis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2016" "DISK" "Staphylococcus" 3 "Kanamycin" "Staphs" "30" 18 18 FALSE @@ -4235,8 +5295,8 @@ "EUCAST 2016" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. catarrhalis" 1 1 FALSE "EUCAST 2016" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 20 17 FALSE "EUCAST 2016" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 1 2 FALSE -"EUCAST 2016" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE +"EUCAST 2016" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE "EUCAST 2016" "DISK" "Staphylococcus" 3 "Levofloxacin" "Staphs" "5" 22 19 FALSE "EUCAST 2016" "MIC" "Staphylococcus" 3 "Levofloxacin" "Staphs" 1 2 FALSE "EUCAST 2016" "DISK" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" "5" 18 15 FALSE @@ -4280,8 +5340,8 @@ "EUCAST 2016" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" "5" 22 22 FALSE "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.5 1 FALSE -"EUCAST 2016" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2016" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.015 FALSE +"EUCAST 2016" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2016" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE "EUCAST 2016" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 0.002 2 FALSE "EUCAST 2016" "MIC" "Haemophilus" 3 "Minocycline" "H. influenzae" 1 2 FALSE "EUCAST 2016" "DISK" "Haemophilus influenzae" 2 "Minocycline" "H. influenzae" "30" 24 21 FALSE @@ -4300,15 +5360,15 @@ "EUCAST 2016" "MIC" "Staphylococcus" 3 "Mupirocin" "Staphs" 1 256 FALSE "EUCAST 2016" "DISK" "Screen" "Haemophilus influenzae" 2 "Nalidixic acid" "H. influenzae" "30" 23 7 FALSE "EUCAST 2016" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. catarrhalis" "30" 23 7 FALSE -"EUCAST 2016" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2016" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE "EUCAST 2016" "DISK" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" "10" 15 12 FALSE "EUCAST 2016" "MIC" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2016" "DISK" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." "10" 16 16 FALSE "EUCAST 2016" "MIC" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2016" "DISK" "Pseudomonas" 3 "Netilmicin" "Pseudo" "10" 12 12 FALSE "EUCAST 2016" "MIC" "Pseudomonas" 3 "Netilmicin" "Pseudo" 4 4 FALSE -"EUCAST 2016" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2016" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE "EUCAST 2016" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Netilmicin" "PK/PD" 2 4 FALSE @@ -4351,16 +5411,16 @@ "EUCAST 2016" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2016" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE "EUCAST 2016" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE -"EUCAST 2016" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE -"EUCAST 2016" "DISK" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2016" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE "EUCAST 2016" "MIC" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2016" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE "EUCAST 2016" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2016" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 2 FALSE -"EUCAST 2016" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.06 FALSE +"EUCAST 2016" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE "EUCAST 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE "EUCAST 2016" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE "EUCAST 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE @@ -4372,9 +5432,9 @@ "EUCAST 2016" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE "EUCAST 2016" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.125 FALSE "EUCAST 2016" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE -"EUCAST 2016" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2016" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2016" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2016" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2016" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE "EUCAST 2016" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2016" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE @@ -4417,11 +5477,11 @@ "EUCAST 2016" "MIC" "Haemophilus" 3 "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE "EUCAST 2016" "DISK" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE "EUCAST 2016" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2016" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.06 FALSE +"EUCAST 2016" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE "EUCAST 2016" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2016" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE -"EUCAST 2016" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2016" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2016" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2016" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE "EUCAST 2016" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE "EUCAST 2016" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE "EUCAST 2016" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -4446,7 +5506,7 @@ "EUCAST 2016" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. catarrhalis" 1 2 FALSE "EUCAST 2016" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE "EUCAST 2016" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 1 2 FALSE -"EUCAST 2016" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2016" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE "EUCAST 2016" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE "EUCAST 2016" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2016" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE @@ -4455,7 +5515,7 @@ "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Pneumo" 1 2 FALSE "EUCAST 2016" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30" 16 16 FALSE "EUCAST 2016" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" "Staphs" 2 2 FALSE "EUCAST 2016" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE "EUCAST 2016" "DISK" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" "30" 15 15 FALSE "EUCAST 2016" "MIC" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE @@ -4486,7 +5546,7 @@ "EUCAST 2016" "MIC" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2016" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" "15" 23 20 FALSE "EUCAST 2016" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" 0.25 0.5 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Staphs" 0.125 0.125 FALSE "EUCAST 2016" "DISK" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5" 18 15 TRUE "EUCAST 2016" "MIC" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE "EUCAST 2016" "DISK" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5" 50 21 TRUE @@ -4500,8 +5560,8 @@ "EUCAST 2016" "MIC" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2016" "DISK" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 16 16 FALSE "EUCAST 2016" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseudo" 4 4 FALSE -"EUCAST 2016" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" "10" 18 18 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2016" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10" 22 22 FALSE "EUCAST 2016" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2016" "MIC" "(unknown name)" 6 "Tobramycin" "PK/PD" 2 4 FALSE @@ -4518,7 +5578,7 @@ "EUCAST 2016" "MIC" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." 2 2 FALSE "EUCAST 2016" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5" 12 12 FALSE "EUCAST 2016" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE -"EUCAST 2016" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2016" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Staphs" 2 2 FALSE "EUCAST 2016" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE "EUCAST 2016" "DISK" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" "5" 13 13 FALSE "EUCAST 2016" "MIC" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" 2 2 FALSE @@ -4547,8 +5607,8 @@ "EUCAST 2015" "MIC" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" "H. influenaza" 2 2 FALSE "EUCAST 2015" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. cattharalis" "2-1" 19 19 FALSE "EUCAST 2015" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. cattharalis" 1 1 FALSE -"EUCAST 2015" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2015" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE "EUCAST 2015" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 18 16 FALSE "EUCAST 2015" "MIC" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" 8 16 FALSE @@ -4556,8 +5616,8 @@ "EUCAST 2015" "MIC" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." 8 16 FALSE "EUCAST 2015" "DISK" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 18 15 FALSE "EUCAST 2015" "MIC" "Pseudomonas" 3 "Amikacin" "Pseudo" 8 16 FALSE -"EUCAST 2015" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" "30" 18 16 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2015" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30" 18 16 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2015" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30" 22 19 FALSE "EUCAST 2015" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Amikacin" "PK/PD" 8 16 FALSE @@ -4570,9 +5630,9 @@ "EUCAST 2015" "DISK" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" "2" 16 16 FALSE "EUCAST 2015" "MIC" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2015" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2015" "DISK" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" "2" 17 17 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" 1 1 FALSE -"EUCAST 2015" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2015" "DISK" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" "2" 17 17 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2015" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" 0.5 2 FALSE "EUCAST 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2" 21 15 FALSE "EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" 0.5 2 FALSE @@ -4582,15 +5642,15 @@ "EUCAST 2015" "MIC" "Helicobacter pylori" 2 "Amoxicillin" "H. pylori" 0.125 0.125 FALSE "EUCAST 2015" "MIC" "Haemophilus influenzae" 2 "Amoxicillin" "H. influenaza" 2 2 FALSE "EUCAST 2015" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE "EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE -"EUCAST 2015" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2015" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2015" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2015" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2015" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2015" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 0.002 4 FALSE -"EUCAST 2015" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2015" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2015" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2015" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 24 21 FALSE "EUCAST 2015" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2015" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 50 16 FALSE @@ -4646,12 +5706,12 @@ "EUCAST 2015" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. cattharalis" "5" 23 23 FALSE "EUCAST 2015" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M. cattharalis" 0.5 0.5 FALSE "EUCAST 2015" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE -"EUCAST 2015" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.03 FALSE +"EUCAST 2015" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE "EUCAST 2015" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 25 22 FALSE "EUCAST 2015" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.5 1 FALSE -"EUCAST 2015" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2015" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.06 FALSE +"EUCAST 2015" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE "EUCAST 2015" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Staphs" "5" 20 20 FALSE "EUCAST 2015" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2015" "DISK" "Streptococcus pneumoniae" 2 "Ciprofloxacin" "Pneumo" "5" 50 16 FALSE @@ -4683,9 +5743,9 @@ "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE "EUCAST 2015" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE "EUCAST 2015" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2015" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "H. influenaza" 0.032 0.03 FALSE -"EUCAST 2015" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 20 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2015" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "H. influenaza" 0.032 0.032 FALSE +"EUCAST 2015" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 1 FALSE "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "Pneumo" 0.25 0.25 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Ceftaroline" "PK/PD" 0.5 0.5 FALSE "EUCAST 2015" "DISK" "Oral" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 23 20 FALSE @@ -4712,8 +5772,8 @@ "EUCAST 2015" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. cattharalis" 1 2 FALSE "EUCAST 2015" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2015" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE -"EUCAST 2015" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" 0.032 0.03 FALSE +"EUCAST 2015" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" "Pneumo" 0.5 2 FALSE "EUCAST 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE "EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE @@ -4755,14 +5815,14 @@ "EUCAST 2015" "MIC" "(unknown name)" 6 "Doripenem" "PK/PD" 1 2 FALSE "EUCAST 2015" "MIC" "Haemophilus influenzae" 2 "Doxycycline" "H. influenaza" 1 2 FALSE "EUCAST 2015" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. cattharalis" 1 2 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE "EUCAST 2015" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2015" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Pneumo" 1 2 FALSE "EUCAST 2015" "DISK" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 24 24 FALSE "EUCAST 2015" "MIC" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE -"EUCAST 2015" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE -"EUCAST 2015" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2015" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE +"EUCAST 2015" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE "EUCAST 2015" "DISK" "Haemophilus influenzae" 2 "Erythromycin" "H. influenaza" "15" 50 10 FALSE "EUCAST 2015" "MIC" "Haemophilus influenzae" 2 "Erythromycin" "H. influenaza" 0.5 16 FALSE "EUCAST 2015" "DISK" "Listeria monocytogenes" 2 "Erythromycin" "Listeria monocytogenes" "15" 25 25 FALSE @@ -4811,8 +5871,8 @@ "EUCAST 2015" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE "EUCAST 2015" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2015" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2015" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE -"EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 80 FALSE +"EUCAST 2015" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE "EUCAST 2015" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 14 FALSE "EUCAST 2015" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2015" "DISK" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." "10" 17 17 FALSE @@ -4820,14 +5880,14 @@ "EUCAST 2015" "DISK" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." "10" 23 23 FALSE "EUCAST 2015" "MIC" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2015" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2015" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE +"EUCAST 2015" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE "EUCAST 2015" "DISK" "Pseudomonas" 3 "Gentamicin" "Pseudo" "10" 15 15 FALSE "EUCAST 2015" "MIC" "Pseudomonas" 3 "Gentamicin" "Pseudo" 4 4 FALSE -"EUCAST 2015" "DISK" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2015" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE "EUCAST 2015" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE -"EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 80 FALSE +"EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 2 4 FALSE "EUCAST 2015" "DISK" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" "10" 22 16 FALSE "EUCAST 2015" "MIC" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" 2 8 FALSE @@ -4844,7 +5904,7 @@ "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Pneumo" 2 2 FALSE "EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Imipenem" "Viridans strept" 2 2 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Imipenem" "PK/PD" 2 8 FALSE -"EUCAST 2015" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2015" "MIC" "Candida albicans" 2 "Itraconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2015" "MIC" "Candida parapsilosis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2015" "MIC" "Candida tropicalis" 2 "Itraconazole" "Candida" 0.125 0.125 FALSE "EUCAST 2015" "DISK" "UTI" "Enterobacterales" 5 "Cephalexin" "Enterobacteriaceae" "30" 14 14 TRUE @@ -4872,8 +5932,8 @@ "EUCAST 2015" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. cattharalis" 1 1 FALSE "EUCAST 2015" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 20 17 FALSE "EUCAST 2015" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 1 2 FALSE -"EUCAST 2015" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE +"EUCAST 2015" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE "EUCAST 2015" "DISK" "Staphylococcus" 3 "Levofloxacin" "Staphs" "5" 22 19 FALSE "EUCAST 2015" "MIC" "Staphylococcus" 3 "Levofloxacin" "Staphs" 1 2 FALSE "EUCAST 2015" "DISK" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" "5" 18 15 FALSE @@ -4917,8 +5977,8 @@ "EUCAST 2015" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" "5" 22 22 FALSE "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.5 1 FALSE -"EUCAST 2015" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2015" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.015 FALSE +"EUCAST 2015" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2015" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE "EUCAST 2015" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 0.002 2 FALSE "EUCAST 2015" "DISK" "Haemophilus influenzae" 2 "Minocycline" "H. influenaza" "30" 24 21 FALSE "EUCAST 2015" "MIC" "Haemophilus influenzae" 2 "Minocycline" "H. influenaza" 1 2 FALSE @@ -4937,15 +5997,15 @@ "EUCAST 2015" "MIC" "Staphylococcus" 3 "Mupirocin" "Staphs" 1 256 FALSE "EUCAST 2015" "DISK" "Screen" "Haemophilus influenzae" 2 "Nalidixic acid" "H. influenaza" "30" 23 7 FALSE "EUCAST 2015" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. cattharalis" "30" 23 7 FALSE -"EUCAST 2015" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2015" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE "EUCAST 2015" "DISK" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" "10" 15 12 FALSE "EUCAST 2015" "MIC" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2015" "DISK" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." "10" 16 16 FALSE "EUCAST 2015" "MIC" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2015" "DISK" "Pseudomonas" 3 "Netilmicin" "Pseudo" "10" 12 12 FALSE "EUCAST 2015" "MIC" "Pseudomonas" 3 "Netilmicin" "Pseudo" 4 4 FALSE -"EUCAST 2015" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2015" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE "EUCAST 2015" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Netilmicin" "PK/PD" 2 4 FALSE @@ -4985,16 +6045,16 @@ "EUCAST 2015" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2015" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE "EUCAST 2015" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE -"EUCAST 2015" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE -"EUCAST 2015" "DISK" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2015" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE "EUCAST 2015" "MIC" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2015" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE "EUCAST 2015" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2015" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 2 FALSE -"EUCAST 2015" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.06 FALSE +"EUCAST 2015" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE "EUCAST 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE "EUCAST 2015" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE "EUCAST 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE @@ -5006,9 +6066,9 @@ "EUCAST 2015" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE "EUCAST 2015" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.125 FALSE "EUCAST 2015" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE -"EUCAST 2015" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2015" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2015" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2015" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2015" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE "EUCAST 2015" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2015" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE @@ -5047,11 +6107,11 @@ "EUCAST 2015" "DISK" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "H. influenaza" "1.25ug/23.75ug" 23 20 FALSE "EUCAST 2015" "MIC" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "H. influenaza" 0.5 1 FALSE "EUCAST 2015" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2015" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.06 FALSE +"EUCAST 2015" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE "EUCAST 2015" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. cattharalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2015" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. cattharalis" 0.5 1 FALSE -"EUCAST 2015" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2015" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2015" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2015" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE "EUCAST 2015" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE "EUCAST 2015" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE "EUCAST 2015" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -5076,7 +6136,7 @@ "EUCAST 2015" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. cattharalis" 1 2 FALSE "EUCAST 2015" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE "EUCAST 2015" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 1 2 FALSE -"EUCAST 2015" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2015" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE "EUCAST 2015" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE "EUCAST 2015" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2015" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE @@ -5085,7 +6145,7 @@ "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Pneumo" 1 2 FALSE "EUCAST 2015" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30" 16 16 FALSE "EUCAST 2015" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" "Staphs" 2 2 FALSE "EUCAST 2015" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE "EUCAST 2015" "DISK" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" "30" 15 15 FALSE "EUCAST 2015" "MIC" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE @@ -5116,7 +6176,7 @@ "EUCAST 2015" "MIC" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2015" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" "15" 23 20 FALSE "EUCAST 2015" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" 0.25 0.5 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Staphs" 0.125 0.125 FALSE "EUCAST 2015" "DISK" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5" 18 15 TRUE "EUCAST 2015" "MIC" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE "EUCAST 2015" "DISK" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5" 50 21 TRUE @@ -5130,8 +6190,8 @@ "EUCAST 2015" "MIC" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2015" "DISK" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 16 16 FALSE "EUCAST 2015" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseudo" 4 4 FALSE -"EUCAST 2015" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" "10" 18 18 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2015" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10" 22 22 FALSE "EUCAST 2015" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2015" "MIC" "(unknown name)" 6 "Tobramycin" "PK/PD" 2 4 FALSE @@ -5145,7 +6205,7 @@ "EUCAST 2015" "MIC" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." 2 2 FALSE "EUCAST 2015" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5" 12 12 FALSE "EUCAST 2015" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE -"EUCAST 2015" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2015" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Staphs" 2 2 FALSE "EUCAST 2015" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE "EUCAST 2015" "DISK" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" "5" 13 13 FALSE "EUCAST 2015" "MIC" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" 2 2 FALSE @@ -5174,8 +6234,8 @@ "EUCAST 2014" "MIC" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" "H. influenaza" 2 2 FALSE "EUCAST 2014" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. cattharalis" "2-1" 19 19 FALSE "EUCAST 2014" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M. cattharalis" 1 1 FALSE -"EUCAST 2014" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2014" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2-1" 15 15 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE "EUCAST 2014" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE "EUCAST 2014" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30" 16 13 FALSE "EUCAST 2014" "MIC" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" 8 16 FALSE @@ -5183,8 +6243,8 @@ "EUCAST 2014" "MIC" "Acinetobacter" 3 "Amikacin" "Acinetobacter spp." 8 16 FALSE "EUCAST 2014" "DISK" "Pseudomonas" 3 "Amikacin" "Pseudo" "30" 18 15 FALSE "EUCAST 2014" "MIC" "Pseudomonas" 3 "Amikacin" "Pseudo" 8 16 FALSE -"EUCAST 2014" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" "30" 18 16 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2014" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30" 18 16 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2014" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30" 22 19 FALSE "EUCAST 2014" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2014" "MIC" "(unknown name)" 6 "Amikacin" "PK/PD" 8 16 FALSE @@ -5197,9 +6257,9 @@ "EUCAST 2014" "DISK" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" "2" 16 16 FALSE "EUCAST 2014" "MIC" "Listeria monocytogenes" 2 "Ampicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2014" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2014" "DISK" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" "2" 17 17 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella multocida" 1 1 FALSE -"EUCAST 2014" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2" 18 18 FALSE +"EUCAST 2014" "DISK" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" "2" 17 17 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2014" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2" 18 18 FALSE "EUCAST 2014" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" 0.5 2 FALSE "EUCAST 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2" 21 15 FALSE "EUCAST 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" 0.5 2 FALSE @@ -5209,15 +6269,15 @@ "EUCAST 2014" "MIC" "Helicobacter pylori" 2 "Amoxicillin" "H. pylori" 0.125 0.125 FALSE "EUCAST 2014" "MIC" "Haemophilus influenzae" 2 "Amoxicillin" "H. influenaza" 2 2 FALSE "EUCAST 2014" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" "N. meningitidis" 0.125 1 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella multocida" 1 1 FALSE "EUCAST 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2014" "MIC" "(unknown name)" 6 "Amoxicillin" "PK/PD" 2 8 FALSE -"EUCAST 2014" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2014" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2014" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2014" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2014" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2014" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Candida" 0.002 4 FALSE -"EUCAST 2014" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2014" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2014" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2014" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30" 24 21 FALSE "EUCAST 2014" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2014" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseudo" "30" 50 16 FALSE @@ -5275,9 +6335,9 @@ "EUCAST 2014" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N. meningitidis" 0.032 0.06 FALSE "EUCAST 2014" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" "5" 25 22 FALSE "EUCAST 2014" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseudo" 0.5 1 FALSE -"EUCAST 2014" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE -"EUCAST 2014" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.06 FALSE +"EUCAST 2014" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "Salmonella" 3 "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE "EUCAST 2014" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Staphs" "5" 20 20 FALSE "EUCAST 2014" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2014" "DISK" "Streptococcus pneumoniae" 2 "Ciprofloxacin" "Pneumo" "5" 50 16 FALSE @@ -5309,9 +6369,9 @@ "EUCAST 2014" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE "EUCAST 2014" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5" 23 23 FALSE "EUCAST 2014" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2014" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "H. influenaza" 0.032 0.03 FALSE -"EUCAST 2014" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5" 20 20 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2014" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "H. influenaza" 0.032 0.032 FALSE +"EUCAST 2014" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5" 20 20 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 1 FALSE "EUCAST 2014" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "Pneumo" 0.25 0.25 FALSE "EUCAST 2014" "MIC" "(unknown name)" 6 "Ceftaroline" "PK/PD" 0.5 0.5 FALSE "EUCAST 2014" "DISK" "Oral" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30" 23 20 FALSE @@ -5338,8 +6398,8 @@ "EUCAST 2014" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M. cattharalis" 1 2 FALSE "EUCAST 2014" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2014" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE -"EUCAST 2014" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella multocida" 0.032 0.03 FALSE +"EUCAST 2014" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" "5" 26 26 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE "EUCAST 2014" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" "Pneumo" 0.5 2 FALSE "EUCAST 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5" 23 23 FALSE "EUCAST 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE @@ -5381,14 +6441,14 @@ "EUCAST 2014" "MIC" "(unknown name)" 6 "Doripenem" "PK/PD" 1 2 FALSE "EUCAST 2014" "MIC" "Haemophilus influenzae" 2 "Doxycycline" "H. influenaza" 1 2 FALSE "EUCAST 2014" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M. cattharalis" 1 2 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella multocida" 1 1 FALSE "EUCAST 2014" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2014" "MIC" "Streptococcus" 3 "Doxycycline" "Strep A, B, C, G" 1 2 FALSE "EUCAST 2014" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Pneumo" 1 2 FALSE "EUCAST 2014" "DISK" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 24 24 FALSE "EUCAST 2014" "MIC" "Campylobacter coli" 2 "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE -"EUCAST 2014" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE -"EUCAST 2014" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2014" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" "15" 20 20 FALSE +"EUCAST 2014" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE "EUCAST 2014" "DISK" "Haemophilus influenzae" 2 "Erythromycin" "H. influenaza" "15" 50 10 FALSE "EUCAST 2014" "MIC" "Haemophilus influenzae" 2 "Erythromycin" "H. influenaza" 0.5 16 FALSE "EUCAST 2014" "DISK" "Listeria monocytogenes" 2 "Erythromycin" "Listeria monocytogenes" "15" 25 25 FALSE @@ -5437,8 +6497,8 @@ "EUCAST 2014" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10" 24 24 FALSE "EUCAST 2014" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2014" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2014" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE -"EUCAST 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 80 FALSE +"EUCAST 2014" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin-high" "Viridans strept" 128 128 FALSE "EUCAST 2014" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10" 17 14 FALSE "EUCAST 2014" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2014" "DISK" "Acinetobacter" 3 "Gentamicin" "Acinetobacter spp." "10" 17 17 FALSE @@ -5446,14 +6506,14 @@ "EUCAST 2014" "DISK" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." "10" 23 23 FALSE "EUCAST 2014" "MIC" "Corynebacterium" 3 "Gentamicin" "Corynebacterium spp." 1 1 FALSE "EUCAST 2014" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2014" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE +"EUCAST 2014" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE "EUCAST 2014" "DISK" "Pseudomonas" 3 "Gentamicin" "Pseudo" "10" 15 15 FALSE "EUCAST 2014" "MIC" "Pseudomonas" 3 "Gentamicin" "Pseudo" 4 4 FALSE -"EUCAST 2014" "DISK" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2014" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10" 22 22 FALSE "EUCAST 2014" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE -"EUCAST 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 80 FALSE +"EUCAST 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gentamicin" "Viridans strept" 128 128 FALSE "EUCAST 2014" "MIC" "(unknown name)" 6 "Gentamicin" "PK/PD" 2 4 FALSE "EUCAST 2014" "DISK" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" "10" 22 16 FALSE "EUCAST 2014" "MIC" "Enterobacterales" 5 "Imipenem" "Enterobacteriaceae" 2 8 FALSE @@ -5495,8 +6555,8 @@ "EUCAST 2014" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M. cattharalis" 1 1 FALSE "EUCAST 2014" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseudo" "5" 20 17 FALSE "EUCAST 2014" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseudo" 1 2 FALSE -"EUCAST 2014" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella multocida" 0.064 0.06 FALSE +"EUCAST 2014" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" "5" 27 27 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE "EUCAST 2014" "DISK" "Staphylococcus" 3 "Levofloxacin" "Staphs" "5" 22 19 FALSE "EUCAST 2014" "MIC" "Staphylococcus" 3 "Levofloxacin" "Staphs" 1 2 FALSE "EUCAST 2014" "DISK" "Streptococcus" 3 "Levofloxacin" "Strep A, B, C, G" "5" 18 15 FALSE @@ -5540,8 +6600,8 @@ "EUCAST 2014" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" "5" 22 22 FALSE "EUCAST 2014" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE "EUCAST 2014" "MIC" "(unknown name)" 6 "Moxifloxacin" "PK/PD" 0.5 1 FALSE -"EUCAST 2014" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2014" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.015 FALSE +"EUCAST 2014" "MIC" "Candida" 3 "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2014" "MIC" "Candida albicans" 2 "Micafungin" "Candida" 0.016 0.016 FALSE "EUCAST 2014" "MIC" "Candida parapsilosis" 2 "Micafungin" "Candida" 0.002 2 FALSE "EUCAST 2014" "DISK" "Haemophilus influenzae" 2 "Minocycline" "H. influenaza" "30" 24 21 FALSE "EUCAST 2014" "MIC" "Haemophilus influenzae" 2 "Minocycline" "H. influenaza" 1 2 FALSE @@ -5560,15 +6620,15 @@ "EUCAST 2014" "MIC" "Staphylococcus" 3 "Mupirocin" "Staphs" 1 256 FALSE "EUCAST 2014" "DISK" "Screen" "Haemophilus influenzae" 2 "Nalidixic acid" "H. influenaza" "30" 23 7 FALSE "EUCAST 2014" "DISK" "Screen" "Moraxella catarrhalis" 2 "Nalidixic acid" "M. cattharalis" "30" 23 7 FALSE -"EUCAST 2014" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE +"EUCAST 2014" "DISK" "Screen" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella multocida" "30" 23 7 FALSE "EUCAST 2014" "DISK" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" "10" 15 12 FALSE "EUCAST 2014" "MIC" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2014" "DISK" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." "10" 16 16 FALSE "EUCAST 2014" "MIC" "Acinetobacter" 3 "Netilmicin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2014" "DISK" "Pseudomonas" 3 "Netilmicin" "Pseudo" "10" 12 12 FALSE "EUCAST 2014" "MIC" "Pseudomonas" 3 "Netilmicin" "Pseudo" 4 4 FALSE -"EUCAST 2014" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" "10" 18 18 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" "10" 18 18 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2014" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10" 22 22 FALSE "EUCAST 2014" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2014" "MIC" "(unknown name)" 6 "Netilmicin" "PK/PD" 2 4 FALSE @@ -5608,16 +6668,16 @@ "EUCAST 2014" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE "EUCAST 2014" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE "EUCAST 2014" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE -"EUCAST 2014" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE -"EUCAST 2014" "DISK" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2014" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2014" "DISK" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE "EUCAST 2014" "MIC" "Staphylococcus lugdunensis" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2014" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE "EUCAST 2014" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE "EUCAST 2014" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 2 FALSE -"EUCAST 2014" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.06 FALSE +"EUCAST 2014" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE "EUCAST 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE "EUCAST 2014" "DISK" "Screen" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1 unit" 18 7 FALSE "EUCAST 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE @@ -5629,9 +6689,9 @@ "EUCAST 2014" "MIC" "(unknown name)" 6 "Piperacillin" "PK/PD" 4 16 FALSE "EUCAST 2014" "MIC" "Aspergillus fumigatus" 2 "Posaconazole" "Aspergillus" 0.125 0.125 FALSE "EUCAST 2014" "MIC" "Aspergillus terreus" 2 "Posaconazole" "Aspergillus" 0.125 0.25 FALSE -"EUCAST 2014" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2014" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2014" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2014" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2014" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" "15" 22 20 FALSE "EUCAST 2014" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2014" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15" 21 18 FALSE @@ -5670,11 +6730,11 @@ "EUCAST 2014" "DISK" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "H. influenaza" "1.25ug/23.75ug" 23 20 FALSE "EUCAST 2014" "MIC" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "H. influenaza" 0.5 1 FALSE "EUCAST 2014" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2014" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.06 FALSE +"EUCAST 2014" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE "EUCAST 2014" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. cattharalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2014" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M. cattharalis" 0.5 1 FALSE -"EUCAST 2014" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2014" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2014" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2014" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE "EUCAST 2014" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE "EUCAST 2014" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE "EUCAST 2014" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -5699,7 +6759,7 @@ "EUCAST 2014" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M. cattharalis" 1 2 FALSE "EUCAST 2014" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE "EUCAST 2014" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N. meningitidis" 1 2 FALSE -"EUCAST 2014" "DISK" "Screen" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE +"EUCAST 2014" "DISK" "Screen" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella multocida" "30" 24 24 FALSE "EUCAST 2014" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30" 22 19 FALSE "EUCAST 2014" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2014" "DISK" "Streptococcus" 3 "Tetracycline" "Strep A, B, C, G" "30" 23 20 FALSE @@ -5708,7 +6768,7 @@ "EUCAST 2014" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Pneumo" 1 2 FALSE "EUCAST 2014" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30" 16 16 FALSE "EUCAST 2014" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" "Staphs" 2 2 FALSE "EUCAST 2014" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE "EUCAST 2014" "DISK" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" "30" 15 15 FALSE "EUCAST 2014" "MIC" "Streptococcus" 3 "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE @@ -5739,7 +6799,7 @@ "EUCAST 2014" "MIC" "Streptococcus" 3 "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE "EUCAST 2014" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" "15" 23 20 FALSE "EUCAST 2014" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" 0.25 0.5 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Staphs" 1 1 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Staphs" 1 1 FALSE "EUCAST 2014" "DISK" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5" 18 15 TRUE "EUCAST 2014" "MIC" "UTI" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE "EUCAST 2014" "DISK" "UTI" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5" 50 21 TRUE @@ -5753,8 +6813,8 @@ "EUCAST 2014" "MIC" "Acinetobacter" 3 "Tobramycin" "Acinetobacter spp." 4 4 FALSE "EUCAST 2014" "DISK" "Pseudomonas" 3 "Tobramycin" "Pseudo" "10" 16 16 FALSE "EUCAST 2014" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseudo" 4 4 FALSE -"EUCAST 2014" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" "10" 18 18 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10" 18 18 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2014" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10" 22 22 FALSE "EUCAST 2014" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2014" "MIC" "(unknown name)" 6 "Tobramycin" "PK/PD" 2 4 FALSE @@ -5768,7 +6828,7 @@ "EUCAST 2014" "MIC" "Corynebacterium" 3 "Vancomycin" "Corynebacterium spp." 2 2 FALSE "EUCAST 2014" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5" 12 12 FALSE "EUCAST 2014" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE -"EUCAST 2014" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2014" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Staphs" 2 2 FALSE "EUCAST 2014" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE "EUCAST 2014" "DISK" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" "5" 13 13 FALSE "EUCAST 2014" "MIC" "Streptococcus" 3 "Vancomycin" "Strep A, B, C, G" 2 2 FALSE @@ -5794,8 +6854,8 @@ "EUCAST 2013" "MIC" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" "H.influenzae" 2 2 FALSE "EUCAST 2013" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M.catarrhalis" "2/1ug" 19 19 FALSE "EUCAST 2013" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M.catarrhalis" 1 1 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella" "2/1ug" 15 15 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin/clavulanic acid" "Pasteurella" 1 1 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella" "2/1ug" 15 15 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Amoxicillin/clavulanic acid" "Pasteurella" 1 1 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" 2 8 FALSE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" "30ug" 16 13 FALSE "EUCAST 2013" "MIC" "Enterobacterales" 5 "Amikacin" "Enterobacteriaceae" 8 16 FALSE @@ -5803,8 +6863,8 @@ "EUCAST 2013" "MIC" "Acinetobacter" 3 "Amikacin" "Acinetob" 8 16 FALSE "EUCAST 2013" "DISK" "Pseudomonas" 3 "Amikacin" "Pseud" "30ug" 18 15 FALSE "EUCAST 2013" "MIC" "Pseudomonas" 3 "Amikacin" "Pseud" 8 16 FALSE -"EUCAST 2013" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" "30ug" 18 16 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2013" "DISK" "Staphylococcus aureus" 2 "Amikacin" "Staphs" "30ug" 18 16 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2013" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" "30ug" 22 19 FALSE "EUCAST 2013" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "Staphs" 8 16 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Amikacin" 8 16 FALSE @@ -5817,9 +6877,9 @@ "EUCAST 2013" "DISK" "Listeria monocytogenes" 2 "Ampicillin" "Listeria" "2ug" 16 16 FALSE "EUCAST 2013" "MIC" "Listeria monocytogenes" 2 "Ampicillin" "Listeria" 1 1 FALSE "EUCAST 2013" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "N.meningitidis" 0.125 1 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella" "2ug" 17 17 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Ampicillin" "Pasteurella" 1 1 FALSE -"EUCAST 2013" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "Staphs" "2ug" 15 15 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella" "2ug" 17 17 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Ampicillin" "Pasteurella" 1 1 FALSE +"EUCAST 2013" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "Staphs" "2ug" 15 15 FALSE "EUCAST 2013" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" "Pneumo" 0.5 2 FALSE "EUCAST 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE "EUCAST 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Viridans strept" 0.5 2 FALSE @@ -5829,14 +6889,14 @@ "EUCAST 2013" "MIC" "Helicobacter pylori" 2 "Amoxicillin" "H.pylori" 0.125 0.125 FALSE "EUCAST 2013" "MIC" "Haemophilus influenzae" 2 "Amoxicillin" "H.influenzae" 2 2 FALSE "EUCAST 2013" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" "N.meningitidis" 0.125 1 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Amoxicillin" "Pasteurella" 1 1 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Amoxicillin" "Pasteurella" 1 1 FALSE "EUCAST 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Amoxicillin" "Viridans strept" 0.5 2 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Amoxicillin" 2 8 FALSE -"EUCAST 2013" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2013" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.03 FALSE -"EUCAST 2013" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2013" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.06 FALSE -"EUCAST 2013" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.06 FALSE +"EUCAST 2013" "MIC" "Candida" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "Candida albicans" 2 "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2013" "MIC" "Candida krusei" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "Pichia" 3 "Anidulafungin" "Candida" 0.064 0.064 FALSE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" "30ug" 24 21 FALSE "EUCAST 2013" "MIC" "Enterobacterales" 5 "Aztreonam" "Enterobacteriaceae" 1 4 FALSE "EUCAST 2013" "DISK" "Pseudomonas" 3 "Aztreonam" "Pseud" "30ug" 50 16 FALSE @@ -5893,8 +6953,8 @@ "EUCAST 2013" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "N.meningitidis" 0.032 0.06 FALSE "EUCAST 2013" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "Pseud" "5ug" 25 22 FALSE "EUCAST 2013" "MIC" "Pseudomonas" 3 "Ciprofloxacin" "Pseud" 0.5 1 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella" "5ug" 27 27 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Ciprofloxacin" "Pasteurella" 0.064 0.06 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella" "5ug" 27 27 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Ciprofloxacin" "Pasteurella" 0.064 0.064 FALSE "EUCAST 2013" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Staphs" "5ug" 20 20 FALSE "EUCAST 2013" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Staphs" 1 1 FALSE "EUCAST 2013" "DISK" "Streptococcus pneumoniae" 2 "Ciprofloxacin" "Pneumo" "5ug" 50 16 FALSE @@ -5924,9 +6984,9 @@ "EUCAST 2013" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE "EUCAST 2013" "MIC" "Enterobacterales" 5 "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE -"EUCAST 2013" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "H.influenzae" 0.032 0.03 FALSE -"EUCAST 2013" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" "5ug" 20 20 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2013" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "H.influenzae" 0.032 0.032 FALSE +"EUCAST 2013" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Staphs" 1 1 FALSE "EUCAST 2013" "MIC" "Streptococcus pneumoniae" 2 "Ceftaroline" "Pneumo" 0.25 0.25 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Ceftaroline" 0.5 0.5 FALSE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Ceftriaxone" "Enterobacteriaceae" "30ug" 23 20 FALSE @@ -5953,8 +7013,8 @@ "EUCAST 2013" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M.catarrhalis" 1 2 FALSE "EUCAST 2013" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "N.gonorrhoeae" 0.125 0.125 FALSE "EUCAST 2013" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "N.meningitidis" 0.125 0.125 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella" "5ug" 26 26 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Cefotaxime" "Pasteurella" 0.032 0.03 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella" "5ug" 26 26 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Cefotaxime" "Pasteurella" 0.032 0.032 FALSE "EUCAST 2013" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" "Pneumo" 0.5 2 FALSE "EUCAST 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE "EUCAST 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE @@ -5999,14 +7059,14 @@ "EUCAST 2013" "MIC" "(unknown name)" 6 "Doripenem" 1 4 FALSE "EUCAST 2013" "MIC" "Haemophilus influenzae" 2 "Doxycycline" "H.influenzae" 1 2 FALSE "EUCAST 2013" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" "M.catarrhalis" 1 2 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Doxycycline" "Pasteurella" 1 1 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Doxycycline" "Pasteurella" 1 1 FALSE "EUCAST 2013" "MIC" "Staphylococcus" 3 "Doxycycline" "Staphs" 1 2 FALSE "EUCAST 2013" "MIC" "Streptococcus" 3 "Doxycycline" "Strept A,B,C,G" 1 2 FALSE "EUCAST 2013" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Pneumo" 1 2 FALSE "EUCAST 2013" "DISK" "Campylobacter coli" 2 "Erythromycin" "Campylobacter" "15ug" 24 24 FALSE "EUCAST 2013" "MIC" "Campylobacter coli" 2 "Erythromycin" "Campylobacter" 8 8 FALSE -"EUCAST 2013" "DISK" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter" "15ug" 20 20 FALSE -"EUCAST 2013" "MIC" "Campylobacter jejuni jejuni" 1 "Erythromycin" "Campylobacter" 4 4 FALSE +"EUCAST 2013" "DISK" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter" "15ug" 20 20 FALSE +"EUCAST 2013" "MIC" "Campylobacter jejuni" 2 "Erythromycin" "Campylobacter" 4 4 FALSE "EUCAST 2013" "DISK" "Haemophilus influenzae" 2 "Erythromycin" "H.influenzae" "15ug" 50 10 FALSE "EUCAST 2013" "MIC" "Haemophilus influenzae" 2 "Erythromycin" "H.influenzae" 0.5 16 FALSE "EUCAST 2013" "DISK" "Listeria monocytogenes" 2 "Erythromycin" "Listeria" "15ug" 25 25 FALSE @@ -6045,27 +7105,27 @@ "EUCAST 2013" "MIC" "Staphylococcus" 3 "Fosfomycin" "Staphs" 32 32 FALSE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE "EUCAST 2013" "MIC" "Enterobacterales" 5 "Cefoxitin" "Enterobacteriaceae" 8 1024 FALSE -"EUCAST 2013" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Staphs" "30ug" 22 22 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2013" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Staphs" 4 4 FALSE "EUCAST 2013" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Cefoxitin" "Staphs" "30ug" 25 25 FALSE "EUCAST 2013" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Staphs" "30ug" 22 22 FALSE "EUCAST 2013" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Staphs" 4 4 FALSE -"EUCAST 2013" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2013" "DISK" "Staphylococcus saprophyticus" 2 "Cefoxitin" "Staphs" "30ug" 22 22 FALSE "EUCAST 2013" "MIC" "Clostridioides difficile" 2 "Fusidic acid" "C.difficile" 2 1024 FALSE "EUCAST 2013" "DISK" "Staphylococcus" 3 "Fusidic acid" "Staphs" "10ug" 24 24 FALSE "EUCAST 2013" "MIC" "Staphylococcus" 3 "Fusidic acid" "Staphs" 1 1 FALSE "EUCAST 2013" "DISK" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2013" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 80 FALSE +"EUCAST 2013" "MIC" "Enterococcus" 3 "Gentamicin-high" "Enterococcus" 128 128 FALSE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" "10ug" 17 14 FALSE "EUCAST 2013" "MIC" "Enterobacterales" 5 "Gentamicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2013" "DISK" "Acinetobacter" 3 "Gentamicin" "Acinetob" "10ug" 17 17 FALSE "EUCAST 2013" "MIC" "Acinetobacter" 3 "Gentamicin" "Acinetob" 4 4 FALSE "EUCAST 2013" "DISK" "Enterococcus" 3 "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE -"EUCAST 2013" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 80 FALSE +"EUCAST 2013" "MIC" "Enterococcus" 3 "Gentamicin" "Enterococcus" 128 128 FALSE "EUCAST 2013" "DISK" "Pseudomonas" 3 "Gentamicin" "Pseud" "10ug" 15 15 FALSE "EUCAST 2013" "MIC" "Pseudomonas" 3 "Gentamicin" "Pseud" 4 4 FALSE -"EUCAST 2013" "DISK" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" "10ug" 18 18 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2013" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" "10ug" 22 22 FALSE "EUCAST 2013" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Gentamicin" "Staphs" 1 1 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Gentamicin" 2 4 FALSE @@ -6107,8 +7167,8 @@ "EUCAST 2013" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M.catarrhalis" 1 1 FALSE "EUCAST 2013" "DISK" "Pseudomonas" 3 "Levofloxacin" "Pseud" "5ug" 20 17 FALSE "EUCAST 2013" "MIC" "Pseudomonas" 3 "Levofloxacin" "Pseud" 1 2 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella" "5ug" 27 27 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Levofloxacin" "Pasteurella" 0.064 0.06 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella" "5ug" 27 27 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Levofloxacin" "Pasteurella" 0.064 0.064 FALSE "EUCAST 2013" "DISK" "Staphylococcus" 3 "Levofloxacin" "Staphs" "5ug" 22 19 FALSE "EUCAST 2013" "MIC" "Staphylococcus" 3 "Levofloxacin" "Staphs" 1 2 FALSE "EUCAST 2013" "DISK" "Streptococcus" 3 "Levofloxacin" "Strept A,B,C,G" "5ug" 18 15 FALSE @@ -6118,8 +7178,8 @@ "EUCAST 2013" "MIC" "(unknown name)" 6 "Levofloxacin" 1 2 FALSE "EUCAST 2013" "DISK" "Urinary tract infect" "Escherichia coli" 2 "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE "EUCAST 2013" "MIC" "Urinary tract infect" "Escherichia coli" 2 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE -"EUCAST 2013" "DISK" "Urinary tract infect" "Klebsiella pneumoniae pneumoniae" 1 "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE -"EUCAST 2013" "MIC" "Urinary tract infect" "Klebsiella pneumoniae pneumoniae" 1 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2013" "DISK" "Urinary tract infect" "Klebsiella pneumoniae" 2 "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2013" "MIC" "Urinary tract infect" "Klebsiella pneumoniae" 2 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE "EUCAST 2013" "DISK" "Urinary tract infect" "Proteus mirabilis" 2 "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE "EUCAST 2013" "MIC" "Urinary tract infect" "Proteus mirabilis" 2 "Mecillinam" "Enterobacteriaceae" 8 8 TRUE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE @@ -6171,15 +7231,15 @@ "EUCAST 2013" "MIC" "Staphylococcus" 3 "Mupirocin" "Staphs" 1 256 FALSE "EUCAST 2013" "DISK" "Haemophilus influenzae" 2 "Nalidixic acid" "H.influenzae" "30ug" 23 7 FALSE "EUCAST 2013" "DISK" "Moraxella catarrhalis" 2 "Nalidixic acid" "M.catarrhalis" "30ug" 23 7 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Nalidixic acid" "Pasteurella" "30ug" 23 7 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Nalidixic acid" "Pasteurella" "30ug" 23 7 FALSE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" "10ug" 15 12 FALSE "EUCAST 2013" "MIC" "Enterobacterales" 5 "Netilmicin" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2013" "DISK" "Acinetobacter" 3 "Netilmicin" "Acinetob" "10ug" 16 16 FALSE "EUCAST 2013" "MIC" "Acinetobacter" 3 "Netilmicin" "Acinetob" 4 4 FALSE "EUCAST 2013" "DISK" "Pseudomonas" 3 "Netilmicin" "Pseud" "10ug" 12 12 FALSE "EUCAST 2013" "MIC" "Pseudomonas" 3 "Netilmicin" "Pseud" 4 4 FALSE -"EUCAST 2013" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" "10ug" 18 18 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2013" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" "10ug" 22 22 FALSE "EUCAST 2013" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "Staphs" 1 1 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Netilmicin" 2 4 FALSE @@ -6187,8 +7247,8 @@ "EUCAST 2013" "MIC" "Urinary tract infect" "Enterobacterales" 5 "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE "EUCAST 2013" "DISK" "Urinary tract infect" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE "EUCAST 2013" "MIC" "Urinary tract infect" "Enterococcus faecalis" 2 "Nitrofurantoin" "Enterococcus" 64 64 TRUE -"EUCAST 2013" "DISK" "Urinary tract infect" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE -"EUCAST 2013" "MIC" "Urinary tract infect" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2013" "DISK" "Urinary tract infect" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2013" "MIC" "Urinary tract infect" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "Staphs" 64 64 TRUE "EUCAST 2013" "DISK" "Urinary tract infect" "Streptococcus group B" 2 "Nitrofurantoin" "Strept A,B,C,G" "100ug" 15 15 TRUE "EUCAST 2013" "MIC" "Urinary tract infect" "Streptococcus group B" 2 "Nitrofurantoin" "Strept A,B,C,G" 64 64 TRUE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Norfloxacin" "Enterobacteriaceae" "10ug" 22 19 FALSE @@ -6209,7 +7269,7 @@ "EUCAST 2013" "DISK" "Streptococcus pneumoniae" 2 "Ofloxacin" "Pneumo" "5ug" 50 13 FALSE "EUCAST 2013" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Pneumo" 0.125 4 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Ofloxacin" 0.5 1 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2013" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Oxacillin" "Staphs" 0.25 0.25 FALSE "EUCAST 2013" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Staphs" 2 2 FALSE "EUCAST 2013" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Pneumo" "1ug" 20 7 FALSE @@ -6218,13 +7278,13 @@ "EUCAST 2013" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "Listeria" 1 1 FALSE "EUCAST 2013" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "N.gonorrhoeae" 0.064 1 FALSE "EUCAST 2013" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "N.meningitidis" 0.064 0.25 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella" "1unit" 17 17 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Benzylpenicillin" "Pasteurella" 0.5 0.5 FALSE -"EUCAST 2013" "DISK" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" "1unit" 26 26 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella" "1unit" 17 17 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Benzylpenicillin" "Pasteurella" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" "1unit" 26 26 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE "EUCAST 2013" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Strept A,B,C,G" "1unit" 18 18 FALSE "EUCAST 2013" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Strept A,B,C,G" 0.25 0.25 FALSE -"EUCAST 2013" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.06 FALSE +"EUCAST 2013" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE "EUCAST 2013" "MIC" "Nonmeningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Pneumo" 0.064 2 FALSE "EUCAST 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" "1unit" 18 12 FALSE "EUCAST 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE @@ -6235,9 +7295,9 @@ "EUCAST 2013" "MIC" "Pseudomonas" 3 "Piperacillin" "Pseud" 16 16 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Piperacillin" 4 16 FALSE "EUCAST 2013" "MIC" "Aspergillus" 3 "Posaconazole" "Aspergillus" 0.125 0.125 FALSE -"EUCAST 2013" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2013" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE -"EUCAST 2013" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.06 FALSE +"EUCAST 2013" "MIC" "Candida albicans" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "Candida parapsilosis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "Candida tropicalis" 2 "Posaconazole" "Candida" 0.064 0.064 FALSE "EUCAST 2013" "DISK" "Enterococcus faecium" 2 "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE "EUCAST 2013" "MIC" "Enterococcus faecium" 2 "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE "EUCAST 2013" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE @@ -6266,9 +7326,9 @@ "EUCAST 2013" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" 2 8 FALSE "EUCAST 2013" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "N.gonorrhoeae" 64 64 FALSE "EUCAST 2013" "DISK" "Enterococcus" 3 "Streptomycin-high" "Enterococcus" "300ug" 19 19 FALSE -"EUCAST 2013" "MIC" "Enterococcus" 3 "Streptomycin-high" "Enterococcus" 512 280 FALSE +"EUCAST 2013" "MIC" "Enterococcus" 3 "Streptomycin-high" "Enterococcus" 512 512 FALSE "EUCAST 2013" "DISK" "Enterococcus" 3 "Streptoduocin" "Enterococcus" "300ug" 19 19 FALSE -"EUCAST 2013" "MIC" "Enterococcus" 3 "Streptoduocin" "Enterococcus" 512 280 FALSE +"EUCAST 2013" "MIC" "Enterococcus" 3 "Streptoduocin" "Enterococcus" 512 512 FALSE "EUCAST 2013" "DISK" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 16 13 FALSE "EUCAST 2013" "MIC" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE "EUCAST 2013" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Acinetob" "1.25ug/23.75ug" 16 13 FALSE @@ -6278,11 +7338,11 @@ "EUCAST 2013" "DISK" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "H.influenzae" "1.25ug/23.75ug" 23 20 FALSE "EUCAST 2013" "MIC" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "H.influenzae" 0.5 1 FALSE "EUCAST 2013" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2013" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria" 0.064 0.06 FALSE +"EUCAST 2013" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "Listeria" 0.064 0.064 FALSE "EUCAST 2013" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M.catarrhalis" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2013" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M.catarrhalis" 0.5 1 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella" "1.25ug/23.75ug" 23 23 FALSE -"EUCAST 2013" "MIC" "Pasteurella multocida multocida" 1 "Trimethoprim/sulfamethoxazole" "Pasteurella" 0.25 0.25 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2013" "MIC" "Pasteurella multocida" 2 "Trimethoprim/sulfamethoxazole" "Pasteurella" 0.25 0.25 FALSE "EUCAST 2013" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "S.maltophilia" "1.25ug/23.75ug" 16 16 FALSE "EUCAST 2013" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "S.maltophilia" 4 4 FALSE "EUCAST 2013" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE @@ -6305,7 +7365,7 @@ "EUCAST 2013" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M.catarrhalis" 1 2 FALSE "EUCAST 2013" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "N.gonorrhoeae" 0.5 1 FALSE "EUCAST 2013" "MIC" "Neisseria meningitidis" 2 "Tetracycline" "N.meningitidis" 1 2 FALSE -"EUCAST 2013" "DISK" "Pasteurella multocida multocida" 1 "Tetracycline" "Pasteurella" "30ug" 24 24 FALSE +"EUCAST 2013" "DISK" "Pasteurella multocida" 2 "Tetracycline" "Pasteurella" "30ug" 24 24 FALSE "EUCAST 2013" "DISK" "Staphylococcus" 3 "Tetracycline" "Staphs" "30ug" 22 19 FALSE "EUCAST 2013" "MIC" "Staphylococcus" 3 "Tetracycline" "Staphs" 1 2 FALSE "EUCAST 2013" "DISK" "Streptococcus" 3 "Tetracycline" "Strept A,B,C,G" "30ug" 23 20 FALSE @@ -6314,7 +7374,7 @@ "EUCAST 2013" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Pneumo" 1 2 FALSE "EUCAST 2013" "DISK" "Enterococcus" 3 "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE "EUCAST 2013" "MIC" "Enterococcus" 3 "Teicoplanin" "Enterococcus" 2 2 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" "Staphs" 2 2 FALSE "EUCAST 2013" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" "Staphs" 4 4 FALSE "EUCAST 2013" "DISK" "Streptococcus" 3 "Teicoplanin" "Strept A,B,C,G" "30ug" 15 15 FALSE "EUCAST 2013" "MIC" "Streptococcus" 3 "Teicoplanin" "Strept A,B,C,G" 2 2 FALSE @@ -6345,7 +7405,7 @@ "EUCAST 2013" "MIC" "Streptococcus" 3 "Telithromycin" "Strept A,B,C,G" 0.25 0.5 FALSE "EUCAST 2013" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" "15ug" 23 20 FALSE "EUCAST 2013" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Pneumo" 0.25 0.5 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Staphs" 1 1 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Staphs" 1 1 FALSE "EUCAST 2013" "DISK" "Urinary tract infect" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" "5ug" 18 15 TRUE "EUCAST 2013" "MIC" "Urinary tract infect" "Enterobacterales" 5 "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE "EUCAST 2013" "DISK" "Urinary tract infect" "Enterococcus" 3 "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE @@ -6359,8 +7419,8 @@ "EUCAST 2013" "MIC" "Acinetobacter" 3 "Tobramycin" "Acinetob" 4 4 FALSE "EUCAST 2013" "DISK" "Pseudomonas" 3 "Tobramycin" "Pseud" "10ug" 16 16 FALSE "EUCAST 2013" "MIC" "Pseudomonas" 3 "Tobramycin" "Pseud" 4 4 FALSE -"EUCAST 2013" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" "10ug" 18 18 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2013" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" "10ug" 22 22 FALSE "EUCAST 2013" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "Staphs" 1 1 FALSE "EUCAST 2013" "MIC" "(unknown name)" 6 "Tobramycin" 2 4 FALSE @@ -6372,7 +7432,7 @@ "EUCAST 2013" "MIC" "Clostridioides difficile" 2 "Vancomycin" "C.difficile" 2 2 FALSE "EUCAST 2013" "DISK" "Enterococcus" 3 "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE "EUCAST 2013" "MIC" "Enterococcus" 3 "Vancomycin" "Enterococcus" 4 4 FALSE -"EUCAST 2013" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2013" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Staphs" 2 2 FALSE "EUCAST 2013" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" "Staphs" 4 4 FALSE "EUCAST 2013" "DISK" "Streptococcus" 3 "Vancomycin" "Strept A,B,C,G" "5ug" 13 13 FALSE "EUCAST 2013" "MIC" "Streptococcus" 3 "Vancomycin" "Strept A,B,C,G" 2 2 FALSE @@ -6393,8 +7453,8 @@ "EUCAST 2012" "MIC" "Acinetobacter" 3 "Amikacin" 8 16 FALSE "EUCAST 2012" "DISK" "Pseudomonas" 3 "Amikacin" "30ug" 18 15 FALSE "EUCAST 2012" "MIC" "Pseudomonas" 3 "Amikacin" 8 16 FALSE -"EUCAST 2012" "DISK" "Staphylococcus aureus aureus" 1 "Amikacin" "30ug" 18 16 FALSE -"EUCAST 2012" "MIC" "Staphylococcus aureus aureus" 1 "Amikacin" 8 16 FALSE +"EUCAST 2012" "DISK" "Staphylococcus aureus" 2 "Amikacin" "30ug" 18 16 FALSE +"EUCAST 2012" "MIC" "Staphylococcus aureus" 2 "Amikacin" 8 16 FALSE "EUCAST 2012" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" "30ug" 22 19 FALSE "EUCAST 2012" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Amikacin" 8 16 FALSE "EUCAST 2012" "DISK" "Enterococcus" 3 "Ampicillin" "2ug" 10 8 FALSE @@ -6404,7 +7464,7 @@ "EUCAST 2012" "DISK" "Listeria monocytogenes" 2 "Ampicillin" "2ug" 16 16 FALSE "EUCAST 2012" "MIC" "Listeria monocytogenes" 2 "Ampicillin" 1 1 FALSE "EUCAST 2012" "MIC" "Neisseria meningitidis" 2 "Ampicillin" 0.125 1 FALSE -"EUCAST 2012" "DISK" "Staphylococcus saprophyticus saprophyticus" 1 "Ampicillin" "2ug" 15 15 FALSE +"EUCAST 2012" "DISK" "Staphylococcus saprophyticus" 2 "Ampicillin" "2ug" 15 15 FALSE "EUCAST 2012" "DISK" "Streptococcus pneumoniae" 2 "Ampicillin" "2ug" 23 20 FALSE "EUCAST 2012" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" 0.5 2 FALSE "EUCAST 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "2ug" 21 15 FALSE @@ -6558,8 +7618,8 @@ "EUCAST 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "30ug" 25 25 FALSE "EUCAST 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" 0.5 0.5 FALSE "EUCAST 2012" "MIC" "Staphylococcus" 3 "Fosfomycin" 32 32 FALSE -"EUCAST 2012" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "30ug" 22 22 FALSE -"EUCAST 2012" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" 4 4 FALSE +"EUCAST 2012" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "30ug" 22 22 FALSE +"EUCAST 2012" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" 4 4 FALSE "EUCAST 2012" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Cefoxitin" "30ug" 25 25 FALSE "EUCAST 2012" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "30ug" 22 22 FALSE "EUCAST 2012" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" 4 4 FALSE @@ -6567,11 +7627,11 @@ "EUCAST 2012" "DISK" "Staphylococcus" 3 "Fusidic acid" "10ug" 24 24 FALSE "EUCAST 2012" "MIC" "Staphylococcus" 3 "Fusidic acid" 1 1 FALSE "EUCAST 2012" "DISK" "Enterococcus" 3 "Gentamicin-high" "30ug" 8 8 FALSE -"EUCAST 2012" "MIC" "Enterococcus" 3 "Gentamicin-high" 128 80 FALSE +"EUCAST 2012" "MIC" "Enterococcus" 3 "Gentamicin-high" 128 128 FALSE "EUCAST 2012" "DISK" "Acinetobacter" 3 "Gentamicin" "10ug" 17 17 FALSE "EUCAST 2012" "MIC" "Acinetobacter" 3 "Gentamicin" 4 4 FALSE "EUCAST 2012" "DISK" "Enterococcus" 3 "Gentamicin" "30ug" 8 8 FALSE -"EUCAST 2012" "MIC" "Enterococcus" 3 "Gentamicin" 128 80 FALSE +"EUCAST 2012" "MIC" "Enterococcus" 3 "Gentamicin" 128 128 FALSE "EUCAST 2012" "DISK" "Pseudomonas" 3 "Gentamicin" "10ug" 15 15 FALSE "EUCAST 2012" "MIC" "Pseudomonas" 3 "Gentamicin" 4 4 FALSE "EUCAST 2012" "DISK" "Staphylococcus" 3 "Gentamicin" "10ug" 18 18 FALSE @@ -6663,14 +7723,14 @@ "EUCAST 2012" "MIC" "Acinetobacter" 3 "Netilmicin" 4 4 FALSE "EUCAST 2012" "DISK" "Pseudomonas" 3 "Netilmicin" "10ug" 12 12 FALSE "EUCAST 2012" "MIC" "Pseudomonas" 3 "Netilmicin" 4 4 FALSE -"EUCAST 2012" "DISK" "Staphylococcus aureus aureus" 1 "Netilmicin" "10ug" 18 18 FALSE -"EUCAST 2012" "MIC" "Staphylococcus aureus aureus" 1 "Netilmicin" 1 1 FALSE +"EUCAST 2012" "DISK" "Staphylococcus aureus" 2 "Netilmicin" "10ug" 18 18 FALSE +"EUCAST 2012" "MIC" "Staphylococcus aureus" 2 "Netilmicin" 1 1 FALSE "EUCAST 2012" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" "10ug" 22 22 FALSE "EUCAST 2012" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Netilmicin" 1 1 FALSE "EUCAST 2012" "DISK" "UTI only" "Enterococcus faecalis" 2 "Nitrofurantoin" "100ug" 15 15 TRUE "EUCAST 2012" "MIC" "UTI only" "Enterococcus faecalis" 2 "Nitrofurantoin" 64 64 TRUE -"EUCAST 2012" "DISK" "UTI only" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" "100ug" 13 13 TRUE -"EUCAST 2012" "MIC" "UTI only" "Staphylococcus saprophyticus saprophyticus" 1 "Nitrofurantoin" 64 64 TRUE +"EUCAST 2012" "DISK" "UTI only" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" "100ug" 13 13 TRUE +"EUCAST 2012" "MIC" "UTI only" "Staphylococcus saprophyticus" 2 "Nitrofurantoin" 64 64 TRUE "EUCAST 2012" "DISK" "UTI only" "Streptococcus group B" 2 "Nitrofurantoin" "100ug" 15 15 TRUE "EUCAST 2012" "MIC" "UTI only" "Streptococcus group B" 2 "Nitrofurantoin" 64 64 TRUE "EUCAST 2012" "DISK" "Staphylococcus" 3 "Norfloxacin" "10ug" 17 17 FALSE @@ -6686,7 +7746,7 @@ "EUCAST 2012" "DISK" "Streptococcus pneumoniae" 2 "Ofloxacin" "5ug" 50 15 FALSE "EUCAST 2012" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" 0.125 4 FALSE "EUCAST 2012" "MIC" "Staphylococcus" 3 "Oxacillin" 0.25 0.25 FALSE -"EUCAST 2012" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" 2 2 FALSE +"EUCAST 2012" "MIC" "Staphylococcus aureus" 2 "Oxacillin" 2 2 FALSE "EUCAST 2012" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" 2 2 FALSE "EUCAST 2012" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "1ug" 20 20 FALSE "EUCAST 2012" "DISK" "Haemophilus influenzae" 2 "Benzylpenicillin" "1 unit" 12 12 FALSE @@ -6699,7 +7759,7 @@ "EUCAST 2012" "DISK" "Beta-haemolytic Streptococcus" 2 "Benzylpenicillin" "1 unit" 18 18 FALSE "EUCAST 2012" "MIC" "Beta-haemolytic Streptococcus" 2 "Benzylpenicillin" 0.25 0.25 FALSE "EUCAST 2012" "MIC" "Other infections" "Streptococcus pneumoniae" 2 "Benzylpenicillin" 0.064 2 FALSE -"EUCAST 2012" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" 0.064 0.06 FALSE +"EUCAST 2012" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" 0.064 0.064 FALSE "EUCAST 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "1 unit" 18 12 FALSE "EUCAST 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" 0.25 2 FALSE "EUCAST 2012" "DISK" "Pseudomonas" 3 "Piperacillin" "30ug" 19 19 FALSE @@ -6728,9 +7788,9 @@ "EUCAST 2012" "MIC" "Haemophilus influenzae" 2 "Ampicillin/sulbactam" 1 1 FALSE "EUCAST 2012" "MIC" "Moraxella catarrhalis" 2 "Ampicillin/sulbactam" 1 1 FALSE "EUCAST 2012" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" 64 64 FALSE -"EUCAST 2012" "MIC" "Enterococcus" 3 "Streptomycin-high" 512 280 FALSE +"EUCAST 2012" "MIC" "Enterococcus" 3 "Streptomycin-high" 512 512 FALSE "EUCAST 2012" "DISK" "Enterococcus" 3 "Streptoduocin" "300ug" 19 19 FALSE -"EUCAST 2012" "MIC" "Enterococcus" 3 "Streptoduocin" 512 280 FALSE +"EUCAST 2012" "MIC" "Enterococcus" 3 "Streptoduocin" 512 512 FALSE "EUCAST 2012" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 16 13 FALSE "EUCAST 2012" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" 2 4 FALSE "EUCAST 2012" "DISK" "Enterococcus" 3 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 50 21 FALSE @@ -6738,7 +7798,7 @@ "EUCAST 2012" "DISK" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 23 20 FALSE "EUCAST 2012" "MIC" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" 0.5 1 FALSE "EUCAST 2012" "DISK" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 29 29 FALSE -"EUCAST 2012" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" 0.064 0.06 FALSE +"EUCAST 2012" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" 0.064 0.064 FALSE "EUCAST 2012" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2012" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" 0.5 1 FALSE "EUCAST 2012" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 16 16 FALSE @@ -6765,7 +7825,7 @@ "EUCAST 2012" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" 1 2 FALSE "EUCAST 2012" "DISK" "Enterococcus" 3 "Teicoplanin" "30ug" 16 16 FALSE "EUCAST 2012" "MIC" "Enterococcus" 3 "Teicoplanin" 2 2 FALSE -"EUCAST 2012" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" 2 2 FALSE +"EUCAST 2012" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" 2 2 FALSE "EUCAST 2012" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Teicoplanin" 4 4 FALSE "EUCAST 2012" "DISK" "Beta-haemolytic Streptococcus" 2 "Teicoplanin" "30ug" 15 15 FALSE "EUCAST 2012" "MIC" "Beta-haemolytic Streptococcus" 2 "Teicoplanin" 2 2 FALSE @@ -6791,7 +7851,7 @@ "EUCAST 2012" "MIC" "Beta-haemolytic Streptococcus" 2 "Telithromycin" 0.25 0.5 FALSE "EUCAST 2012" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "15ug" 25 22 FALSE "EUCAST 2012" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" 0.25 0.5 FALSE -"EUCAST 2012" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" 1 1 FALSE +"EUCAST 2012" "MIC" "Staphylococcus aureus" 2 "Telavancin" 1 1 FALSE "EUCAST 2012" "DISK" "UTI only" "Enterococcus" 3 "Trimethoprim" "5ug" 50 21 TRUE "EUCAST 2012" "MIC" "UTI only" "Enterococcus" 3 "Trimethoprim" 0.032 1 TRUE "EUCAST 2012" "DISK" "UTI only" "Staphylococcus" 3 "Trimethoprim" "5ug" 17 14 TRUE @@ -6801,8 +7861,8 @@ "EUCAST 2012" "MIC" "Acinetobacter" 3 "Tobramycin" 4 4 FALSE "EUCAST 2012" "DISK" "Pseudomonas" 3 "Tobramycin" "10ug" 16 16 FALSE "EUCAST 2012" "MIC" "Pseudomonas" 3 "Tobramycin" 4 4 FALSE -"EUCAST 2012" "DISK" "Staphylococcus aureus aureus" 1 "Tobramycin" "10ug" 18 18 FALSE -"EUCAST 2012" "MIC" "Staphylococcus aureus aureus" 1 "Tobramycin" 1 1 FALSE +"EUCAST 2012" "DISK" "Staphylococcus aureus" 2 "Tobramycin" "10ug" 18 18 FALSE +"EUCAST 2012" "MIC" "Staphylococcus aureus" 2 "Tobramycin" 1 1 FALSE "EUCAST 2012" "DISK" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" "10ug" 22 22 FALSE "EUCAST 2012" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Tobramycin" 1 1 FALSE "EUCAST 2012" "DISK" "Pseudomonas" 3 "Piperacillin/tazobactam" "30ug/6ug" 19 19 FALSE @@ -6810,7 +7870,7 @@ "EUCAST 2012" "MIC" "Clostridioides difficile" 2 "Vancomycin" 2 2 FALSE "EUCAST 2012" "DISK" "Enterococcus" 3 "Vancomycin" "5ug" 12 12 FALSE "EUCAST 2012" "MIC" "Enterococcus" 3 "Vancomycin" 4 4 FALSE -"EUCAST 2012" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" 2 2 FALSE +"EUCAST 2012" "MIC" "Staphylococcus aureus" 2 "Vancomycin" 2 2 FALSE "EUCAST 2012" "MIC" "Coagulase-negative Staphylococcus (CoNS)" 2 "Vancomycin" 4 4 FALSE "EUCAST 2012" "DISK" "Beta-haemolytic Streptococcus" 2 "Vancomycin" "5ug" 13 13 FALSE "EUCAST 2012" "MIC" "Beta-haemolytic Streptococcus" 2 "Vancomycin" 2 2 FALSE @@ -6822,16 +7882,12 @@ "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" "20ug" 20 20 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" 1 1 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" 1 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 12 12 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 8 FALSE "EUCAST 2011" "DISK" "Acinetobacter" 3 "Amikacin" "30ug" 18 15 FALSE "EUCAST 2011" "MIC" "Acinetobacter" 3 "Amikacin" 8 16 FALSE "EUCAST 2011" "DISK" "Pseudomonas" 3 "Amikacin" "30ug" 18 15 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Amikacin" 8 16 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Amikacin" "30ug" 18 15 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Amikacin" 8 16 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 13 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 8 16 FALSE "EUCAST 2011" "DISK" "Enterococcus" 3 "Ampicillin" "2ug" 10 8 FALSE "EUCAST 2011" "MIC" "Enterococcus" 3 "Ampicillin" 4 8 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Ampicillin" "2ug" 16 16 FALSE @@ -6842,18 +7898,13 @@ "EUCAST 2011" "MIC" "Streptococcus" 3 "Ampicillin" 0.5 2 FALSE "EUCAST 2011" "DISK" "Streptococcus pneumoniae" 2 "Ampicillin" "2ug" 28 22 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Ampicillin" 0.5 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 12 12 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 8 FALSE "EUCAST 2011" "MIC" "Enterococcus" 3 "Amoxicillin" 4 8 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Amoxicillin" 1 1 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin" 1 1 FALSE "EUCAST 2011" "MIC" "Neisseria meningitidis" 2 "Amoxicillin" 0.125 1 FALSE "EUCAST 2011" "MIC" "Streptococcus" 3 "Amoxicillin" 0.5 2 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Amoxicillin" "Generic rules" "10ug" 8 8 FALSE "EUCAST 2011" "DISK" "Pseudomonas" 3 "Aztreonam" "30ug" 50 16 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Aztreonam" 1 16 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 25 21 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 1 8 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Azithromycin" 0.125 4 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Azithromycin" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Neisseria gonorrhoeae" 2 "Azithromycin" 0.25 0.5 FALSE @@ -6866,8 +7917,6 @@ "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Azithromycin" 0.25 0.5 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Azithromycin" 0.25 0.5 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Ceftazidime" 8 8 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "10ug" 20 15 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "10ug" 1 8 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Cefaclor" "30ug" 15 15 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Cefaclor" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" 0.5 0.5 FALSE @@ -6877,10 +7926,6 @@ "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Cefixime" 0.125 0.125 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Cefixime" 0.5 1 FALSE "EUCAST 2011" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" 0.125 0.125 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 17 17 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Cefadroxil" "Generic rules" "30ug" 12 12 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Cefadroxil" "Generic rules" "30ug" 16 16 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Chloramphenicol" "30ug" 28 25 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Chloramphenicol" 1 2 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Chloramphenicol" 1 2 FALSE @@ -6894,23 +7939,19 @@ "EUCAST 2011" "DISK" "Streptococcus pneumoniae" 2 "Chloramphenicol" "30ug" 20 20 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Chloramphenicol" 8 8 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Chloramphenicol" 8 8 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 17 17 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 8 FALSE "EUCAST 2011" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "5ug" 21 21 FALSE "EUCAST 2011" "MIC" "Acinetobacter" 3 "Ciprofloxacin" 1 1 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Ciprofloxacin" "5ug" 23 23 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Ciprofloxacin" 0.5 0.5 FALSE "EUCAST 2011" "DISK" "Moraxella catarrhalis" 2 "Ciprofloxacin" "5ug" 23 23 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" 0.5 0.5 FALSE -"EUCAST 2011" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" 0.032 0.03 FALSE -"EUCAST 2011" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" 0.032 0.03 FALSE +"EUCAST 2011" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" 0.032 0.032 FALSE +"EUCAST 2011" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" 0.032 0.032 FALSE "EUCAST 2011" "DISK" "Pseudomonas" 3 "Ciprofloxacin" "5ug" 25 22 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Ciprofloxacin" 0.5 1 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "5ug" 19 19 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Ciprofloxacin" 1 1 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Ciprofloxacin" 0.125 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 22 19 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 0.5 1 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Clindamycin" "2ug" 21 18 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Clindamycin" 0.25 0.5 FALSE "EUCAST 2011" "DISK" "Streptococcus" 3 "Clindamycin" "2ug" 19 19 FALSE @@ -6942,14 +7983,11 @@ "EUCAST 2011" "MIC" "Acinetobacter" 3 "Colistin" 2 2 FALSE "EUCAST 2011" "MIC" "Neisseria meningitidis" 2 "Colistin" 2 4 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Colistin" 2 2 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 2 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Cefpodoxime" "10ug" 24 21 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Cefpodoxime" 0.25 0.5 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Cefpodoxime" 0.25 0.5 FALSE "EUCAST 2011" "DISK" "Streptococcus pneumoniae" 2 "Cefpodoxime" "10ug" 28 25 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" 0.25 0.5 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 21 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 1 1 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Ceftriaxone" "30ug" 27 27 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Ceftriaxone" 0.125 0.125 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Ceftriaxone" 1 2 FALSE @@ -6958,13 +7996,9 @@ "EUCAST 2011" "DISK" "Streptococcus" 3 "Ceftriaxone" "30ug" 27 27 FALSE "EUCAST 2011" "MIC" "Streptococcus" 3 "Ceftriaxone" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Ceftriaxone" 0.5 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 20 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 2 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Ceftibuten" "30ug" 24 24 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Ceftibuten" 1 1 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Ceftibuten" 1 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 21 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 1 1 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Cefotaxime" "5ug" 22 22 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Cefotaxime" 0.125 0.125 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" 1 2 FALSE @@ -6973,22 +8007,16 @@ "EUCAST 2011" "DISK" "Streptococcus" 3 "Cefotaxime" "5ug" 23 23 FALSE "EUCAST 2011" "MIC" "Streptococcus" 3 "Cefotaxime" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefotaxime" 0.5 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "5ug" 21 18 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "5ug" 1 2 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Cefuroxime axetil" "30ug" 50 25 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Cefuroxime axetil" 0.125 1 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Cefuroxime axetil" 0.125 2 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" 0.25 0.5 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 18 18 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 8 8 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Cefuroxime" "30ug" 25 22 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Cefuroxime" 1 2 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Cefuroxime" 1 2 FALSE "EUCAST 2011" "DISK" "Streptococcus" 3 "Cefuroxime" "30ug" 26 26 FALSE "EUCAST 2011" "MIC" "Streptococcus" 3 "Cefuroxime" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime" 0.5 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 18 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 8 FALSE "EUCAST 2011" "MIC" "Streptococcus" 3 "Cefazolin" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Daptomycin" 1 1 FALSE "EUCAST 2011" "MIC" "Streptococcus group A" 2 "Daptomycin" 1 1 FALSE @@ -7013,8 +8041,6 @@ "EUCAST 2011" "MIC" "Beta-haemolytic Streptococcus" 2 "Doripenem" 1 1 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" 1 1 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Doripenem" 1 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 24 18 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Doxycycline" 1 2 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Doxycycline" 1 2 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Doxycycline" 1 2 FALSE @@ -7057,8 +8083,6 @@ "EUCAST 2011" "MIC" "Beta-haemolytic Streptococcus" 2 "Ertapenem" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Ertapenem" 0.5 0.5 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 25 22 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 1 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Cefepime" "30ug" 25 25 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Cefepime" 0.25 0.25 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Cefepime" 0.25 0.25 FALSE @@ -7067,13 +8091,10 @@ "EUCAST 2011" "MIC" "Streptococcus" 3 "Cefepime" 0.5 0.5 FALSE "EUCAST 2011" "DISK" "Streptococcus pneumoniae" 2 "Cefepime" "30ug" 32 29 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefepime" 1 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 24 18 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 1 8 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Fosfomycin" 32 32 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Fosfomycin" 32 32 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 32 32 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Cefoxitin" "30ug" 25 25 FALSE -"EUCAST 2011" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "30ug" 22 22 FALSE +"EUCAST 2011" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "30ug" 22 22 FALSE "EUCAST 2011" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "30ug" 22 22 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Fusidic acid" "10ug" 22 22 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Fusidic acid" 1 1 FALSE @@ -7086,8 +8107,6 @@ "EUCAST 2011" "MIC" "Pseudomonas" 3 "Gentamicin" 4 4 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Gentamicin" "10ug" 18 18 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Gentamicin" 1 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 17 14 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 2 4 FALSE "EUCAST 2011" "DISK" "Acinetobacter" 3 "Imipenem" "10ug" 23 17 FALSE "EUCAST 2011" "MIC" "Acinetobacter" 3 "Imipenem" 2 8 FALSE "EUCAST 2011" "DISK" "Enterococcus" 3 "Imipenem" "10ug" 21 18 FALSE @@ -7106,9 +8125,6 @@ "EUCAST 2011" "MIC" "Beta-haemolytic Streptococcus" 2 "Imipenem" 2 2 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" 2 2 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Imipenem" 2 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 21 15 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 2 8 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Cephalexin" "Generic rules" "30ug" 16 16 FALSE "EUCAST 2011" "DISK" "Enterococcus" 3 "Linezolid" "10ug" 19 19 FALSE "EUCAST 2011" "MIC" "Enterococcus" 3 "Linezolid" 4 4 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Linezolid" "10ug" 17 17 FALSE @@ -7149,10 +8165,6 @@ "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Levofloxacin" 2 2 FALSE "EUCAST 2011" "DISK" "Streptococcus pyogenes" 2 "Levofloxacin" "5ug" 18 15 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Levofloxacin" 1 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 22 19 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 1 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 15 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 8 FALSE "EUCAST 2011" "DISK" "Acinetobacter" 3 "Meropenem" "10ug" 21 15 FALSE "EUCAST 2011" "MIC" "Acinetobacter" 3 "Meropenem" 2 8 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Meropenem" "10ug" 20 20 FALSE @@ -7170,8 +8182,6 @@ "EUCAST 2011" "MIC" "Beta-haemolytic Streptococcus" 2 "Meropenem" 2 2 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" 2 2 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Meropenem" 2 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 22 16 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 2 8 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Moxifloxacin" "5ug" 23 23 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Moxifloxacin" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Moxifloxacin" 0.5 0.5 FALSE @@ -7191,8 +8201,6 @@ "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" 0.5 0.5 FALSE "EUCAST 2011" "DISK" "Streptococcus pyogenes" 2 "Moxifloxacin" "5ug" 18 15 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Moxifloxacin" 0.5 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 20 17 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 1 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Minocycline" 1 2 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Minocycline" 1 2 FALSE "EUCAST 2011" "MIC" "Neisseria gonorrhoeae" 2 "Minocycline" 0.5 1 FALSE @@ -7206,15 +8214,11 @@ "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Minocycline" 0.5 1 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Minocycline" 0.5 1 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Nalidixic acid" "30ug" 23 23 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 16 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 16 FALSE "EUCAST 2011" "DISK" "Acinetobacter" 3 "Netilmicin" "10ug" 15 15 FALSE "EUCAST 2011" "MIC" "Acinetobacter" 3 "Netilmicin" 4 4 FALSE "EUCAST 2011" "DISK" "Pseudomonas" 3 "Netilmicin" "10ug" 10 10 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Netilmicin" 4 4 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Netilmicin" 1 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "10ug" 15 12 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "10ug" 2 4 FALSE "EUCAST 2011" "DISK" "Enterococcus" 3 "Nitrofurantoin" "100ug" 15 15 FALSE "EUCAST 2011" "MIC" "Enterococcus" 3 "Nitrofurantoin" 64 64 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "100ug" 13 13 FALSE @@ -7231,12 +8235,8 @@ "EUCAST 2011" "MIC" "Beta-haemolytic Streptococcus" 2 "Nitrofurantoin" 64 64 FALSE "EUCAST 2011" "DISK" "Streptococcus pyogenes" 2 "Nitrofurantoin" "100ug" 15 15 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Nitrofurantoin" 64 64 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 11 11 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 64 64 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Norfloxacin" "10ug" 17 17 FALSE "EUCAST 2011" "DISK" "Streptococcus pneumoniae" 2 "Norfloxacin" "10ug" 12 12 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 22 19 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 0.5 1 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Ofloxacin" "5ug" 21 21 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Ofloxacin" 0.5 0.5 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Ofloxacin" 0.5 0.5 FALSE @@ -7244,10 +8244,8 @@ "EUCAST 2011" "MIC" "Staphylococcus" 3 "Ofloxacin" 1 1 FALSE "EUCAST 2011" "DISK" "Streptococcus pneumoniae" 2 "Ofloxacin" "5ug" 50 15 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" 0.125 4 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 22 19 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 0.5 1 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Oxacillin" 0.25 0.25 FALSE -"EUCAST 2011" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" 2 2 FALSE +"EUCAST 2011" "MIC" "Staphylococcus aureus" 2 "Oxacillin" 2 2 FALSE "EUCAST 2011" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" 2 2 FALSE "EUCAST 2011" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "1ug" 18 18 FALSE "EUCAST 2011" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" 0.064 1 FALSE @@ -7272,8 +8270,6 @@ "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Phenoxymethylpenicillin" "10" 15 15 FALSE "EUCAST 2011" "DISK" "Pseudomonas" 3 "Piperacillin" "30ug" 19 19 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Piperacillin" 16 16 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "30ug" 18 15 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "30ug" 8 16 FALSE "EUCAST 2011" "MIC" "Enterococcus faecium" 2 "Quinupristin/dalfopristin" 1 4 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Quinupristin/dalfopristin" 1 2 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Rifampicin" "5ug" 18 18 FALSE @@ -7307,7 +8303,6 @@ "EUCAST 2011" "MIC" "Enterococcus" 3 "Ampicillin/sulbactam" 4 8 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Ampicillin/sulbactam" 1 1 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Ampicillin/sulbactam" 1 1 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 8 FALSE "EUCAST 2011" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" 64 64 FALSE "EUCAST 2011" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 16 13 FALSE "EUCAST 2011" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" 2 4 FALSE @@ -7334,10 +8329,7 @@ "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" 1 2 FALSE "EUCAST 2011" "DISK" "Streptococcus pyogenes" 2 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 18 15 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Trimethoprim/sulfamethoxazole" 1 2 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 13 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Ticarcillin/clavulanic acid" 16 16 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 8 16 FALSE "EUCAST 2011" "DISK" "Haemophilus influenzae" 2 "Tetracycline" "30ug" 24 21 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Tetracycline" 1 2 FALSE "EUCAST 2011" "DISK" "Moraxella catarrhalis" 2 "Tetracycline" "30ug" 28 25 FALSE @@ -7363,7 +8355,7 @@ "EUCAST 2011" "DISK" "Enterococcus" 3 "Teicoplanin" "30ug" 16 16 FALSE "EUCAST 2011" "MIC" "Enterococcus" 3 "Teicoplanin" 2 2 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Teicoplanin" 4 4 FALSE -"EUCAST 2011" "MIC" "Staphylococcus aureus aureus" 1 "Teicoplanin" 2 2 FALSE +"EUCAST 2011" "MIC" "Staphylococcus aureus" 2 "Teicoplanin" 2 2 FALSE "EUCAST 2011" "MIC" "Staphylococcus lugdunensis" 2 "Teicoplanin" 2 2 FALSE "EUCAST 2011" "MIC" "Streptococcus" 3 "Teicoplanin" 2 2 FALSE "EUCAST 2011" "MIC" "Streptococcus group A" 2 "Teicoplanin" 2 2 FALSE @@ -7389,11 +8381,7 @@ "EUCAST 2011" "MIC" "Beta-haemolytic Streptococcus" 2 "Tigecycline" 0.25 0.5 FALSE "EUCAST 2011" "DISK" "Streptococcus pyogenes" 2 "Tigecycline" "15ug" 19 16 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Tigecycline" 0.25 0.5 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Tigecycline" "Generic rules" "15ug" 18 15 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Tigecycline" "Generic rules" "15ug" 1 2 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Ticarcillin" 16 16 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Ticarcillin" "Generic rules" "75ug" 23 22 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Ticarcillin" "Generic rules" "75ug" 8 16 FALSE "EUCAST 2011" "MIC" "Haemophilus influenzae" 2 "Telithromycin" 0.125 8 FALSE "EUCAST 2011" "MIC" "Moraxella catarrhalis" 2 "Telithromycin" 0.25 0.5 FALSE "EUCAST 2011" "MIC" "Streptococcus group A" 2 "Telithromycin" 0.25 0.5 FALSE @@ -7407,20 +8395,14 @@ "EUCAST 2011" "MIC" "Enterococcus" 3 "Trimethoprim" 0.32 1 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Trimethoprim" "5ug" 17 14 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Trimethoprim" 2 4 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 18 15 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 2 4 FALSE "EUCAST 2011" "DISK" "Acinetobacter" 3 "Tobramycin" "10ug" 15 15 FALSE "EUCAST 2011" "MIC" "Acinetobacter" 3 "Tobramycin" 4 4 FALSE "EUCAST 2011" "DISK" "Pseudomonas" 3 "Tobramycin" "10ug" 15 15 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Tobramycin" 4 4 FALSE "EUCAST 2011" "DISK" "Staphylococcus" 3 "Tobramycin" "10ug" 19 19 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Tobramycin" 1 1 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 2 4 FALSE "EUCAST 2011" "DISK" "Pseudomonas" 3 "Piperacillin/tazobactam" "30ug" 19 19 FALSE "EUCAST 2011" "MIC" "Pseudomonas" 3 "Piperacillin/tazobactam" 16 16 FALSE -"EUCAST 2011" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "30/6ug" 18 15 FALSE -"EUCAST 2011" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "30/6ug" 8 16 FALSE "EUCAST 2011" "DISK" "Enterococcus" 3 "Vancomycin" "5ug" 12 12 FALSE "EUCAST 2011" "MIC" "Enterococcus" 3 "Vancomycin" 4 4 FALSE "EUCAST 2011" "MIC" "Staphylococcus" 3 "Vancomycin" 2 2 FALSE @@ -7433,6 +8415,1272 @@ "EUCAST 2011" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "5ug" 15 15 FALSE "EUCAST 2011" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" 2 2 FALSE "EUCAST 2011" "MIC" "Streptococcus pyogenes" 2 "Vancomycin" 2 2 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Amoxicillin/clavulanic acid" "Table 2A" "20ug/10ug" 18 13 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Amoxicillin/clavulanic acid" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug" 18 13 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2022" "MIC" "Burkholderia pseudomallei" 2 "Amoxicillin/clavulanic acid" "M45 Table 21" 8 32 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Amoxicillin/clavulanic acid" "Table 2E" 2 8 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Amoxicillin/clavulanic acid" "Table 2E" 2 8 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2022" "DISK" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M45 Table 16" "20ug" 24 23 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Amoxicillin/clavulanic acid" "M45 Table 16" 4 8 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 17" "20ug" 27 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Amoxicillin/clavulanic acid" "M45 Table 20" "20ug" 18 13 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Amoxicillin/clavulanic acid" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Amikacin" "Table 2A" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Amikacin" "Table 2A" 16 64 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Amikacin" "M45 Table 4" 16 64 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Amikacin" "M45 Table 20" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Amikacin" "M45 Table 20" 16 64 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ampicillin" "Table 2A" "10ug" 17 13 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ampicillin" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 4" 0.25 0.5 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Leuconostoc" 3 "Ampicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Ampicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Ampicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2022" "MIC" "Listeria monocytogenes" 2 "Ampicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2022" "MIC" "Pediococcus" 3 "Ampicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Ampicillin" "M45 Table 17" "10ug" 27 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Ampicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Ampicillin" "Table 2H-1" "10ug" 24 6 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Ampicillin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Ampicillin" "M45 Table 20" "10ug" 17 13 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Ampicillin" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2022" "MIC" "Bacillus anthracis" 2 "Amoxicillin" "M45 Table 21" 0.125 0.25 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2022" "MIC" "Candida" 3 "Anidulafungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2022" "MIC" "Candida albicans" 2 "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "Candida krusei" 2 "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "Candida parapsilosis" 2 "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2022" "MIC" "Candida tropicalis" 2 "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "Meyerozyma guilliermondii" 2 "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2022" "MIC" "Pichia" 3 "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Aztreonam" "Table 2A" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Aztreonam" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Aztreonam" "M45 Table 3" 4 16 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Aztreonam" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Aztreonam" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Azithromycin" "Table 2E" "15ug" 12 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Azithromycin" "Table 2E" "15ug" 12 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2022" "DISK" "Moraxella catarrhalis" 2 "Azithromycin" "M45 Table 16" "15ug" 26 6 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Azithromycin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Azithromycin" "Table 2F" "15ug" 30 6 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Azithromycin" "Table 2F" 1 2048 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Azithromycin" "Table 2I" "15ug" 20 6 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Azithromycin" "M45 Table 17" "15ug" 20 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Azithromycin" "M45 Table 17" 1 2048 FALSE +"CLSI 2022" "DISK" "Shigella" 3 "Azithromycin" "Table 2A" "15ug" 16 10 FALSE +"CLSI 2022" "MIC" "Shigella" 3 "Azithromycin" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Salmonella enterica" 2 "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2022" "MIC" "Salmonella enterica" 2 "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Azithromycin" "M45 Table 20" 2 2048 FALSE +"CLSI 2022" "MIC" "Candida" 3 "Caspofungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2022" "DISK" "Candida albicans" 2 "Caspofungin" "Table 1" 17 14 FALSE +"CLSI 2022" "MIC" "Candida albicans" 2 "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Candida krusei" 2 "Caspofungin" "Table 1" 17 14 FALSE +"CLSI 2022" "MIC" "Candida krusei" 2 "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Candida parapsilosis" 2 "Caspofungin" "Table 1" 13 10 FALSE +"CLSI 2022" "MIC" "Candida parapsilosis" 2 "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Candida tropicalis" 2 "Caspofungin" "Table 1" 17 14 FALSE +"CLSI 2022" "MIC" "Candida tropicalis" 2 "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Meyerozyma guilliermondii" 2 "Caspofungin" "Table 1" 13 10 FALSE +"CLSI 2022" "MIC" "Meyerozyma guilliermondii" 2 "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Pichia" 3 "Caspofungin" "Table 1" 17 14 FALSE +"CLSI 2022" "MIC" "Pichia" 3 "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefetamet" "Table 2A" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefetamet" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ceftazidime" "Table 2A" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ceftazidime" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Ceftazidime" "M45 Table 3" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "Burkholderia cepacia" 2 "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Parenteral" "Burkholderia cepacia" 2 "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2022" "MIC" "Burkholderia mallei" 2 "Ceftazidime" "M45 Table 21" 8 32 FALSE +"CLSI 2022" "MIC" "Burkholderia pseudomallei" 2 "Ceftazidime" "M45 Table 21" 8 32 FALSE +"CLSI 2022" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ceftazidime" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ceftazidime" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Ceftazidime" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2022" "MIC" "Parenteral" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Ceftazidime" "M45 Table 20" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Ceftazidime" "M45 Table 20" 4 16 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefdinir" "Table 2A" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefdinir" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefaclor" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefaclor" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 16" 8 32 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefixime" "Table 2A" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefixime" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefixime" "Table 2E" "5ug" 21 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefixime" "Table 2E" "5ug" 21 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefoperazone" "Table 2A" "75ug" 21 15 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefoperazone" "Table 2A" 16 64 FALSE +"CLSI 2022" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Chloramphenicol" "Table 2A" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Chloramphenicol" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Chloramphenicol" "M45 Table 4" 8 32 FALSE +"CLSI 2022" "MIC" "Burkholderia cepacia" 2 "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2022" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 21" 8 2048 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "Leuconostoc" 3 "Chloramphenicol" "M45 Table 13" 8 32 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Chloramphenicol" "M45 Table 16" 2 8 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2022" "MIC" "Pediococcus" 3 "Chloramphenicol" "M45 Table 18" 8 32 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Chloramphenicol" "M45 Table 17" "30ug" 28 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Chloramphenicol" "M45 Table 17" 2 2048 FALSE +"CLSI 2022" "MIC" "Stenotrophomonas maltophilia" 2 "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Chloramphenicol" "Table 2H-1" 4 16 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Chloramphenicol" "M45 Table 20" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Chloramphenicol" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 21" 8 32 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefonicid" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefonicid" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "Urine" "Enterobacterales" 5 "Cinoxacin" "Table 2A" "100ug" 19 14 TRUE +"CLSI 2022" "MIC" "Urine" "Enterobacterales" 5 "Cinoxacin" "Table 2A" 16 64 TRUE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ciprofloxacin" "Table 2A" "5ug" 26 21 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ciprofloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Ciprofloxacin" "M45 Table 4" 1 4 FALSE +"CLSI 2022" "MIC" "Bacillus anthracis" 2 "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Campylobacter" 3 "Ciprofloxacin" "M45 Table 5" 24 20 FALSE +"CLSI 2022" "MIC" "Campylobacter" 3 "Ciprofloxacin" "M45 Table 5" 1 4 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2022" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Ciprofloxacin" "M45 Table 16" 1 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Ciprofloxacin" "Table 2B-1" "5ug" 25 18 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Ciprofloxacin" "Table 2B-1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Salmonella" 3 "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2022" "MIC" "Salmonella" 3 "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Ciprofloxacin" "M45 Table 20" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Ciprofloxacin" "M45 Table 20" 1 4 FALSE +"CLSI 2022" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 4" 0.5 4 FALSE +"CLSI 2022" "MIC" "Gemella" 3 "Clindamycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Clindamycin" "M45 Table 11" 0.5 2 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2022" "MIC" "Micrococcus" 3 "Clindamycin" "M45 Table 15" 0.5 4 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Clindamycin" "M45 Table 16" 0.5 4 FALSE +"CLSI 2022" "MIC" "Paenibacillus mucilaginosus" 2 "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2022" "MIC" "Rothia mucilaginosa" 2 "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Clindamycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2022" "MIC" "Helicobacter pylori" 2 "Clarithromycin" "M45 Table 10" 0.25 1 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2022" "DISK" "Moraxella catarrhalis" 2 "Clarithromycin" "M45 Table 16" "15ug" 24 6 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Clarithromycin" "M45 Table 16" 1 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefmetazole" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefmetazole" "Table 2A" 16 64 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Colistin" "Table 2A" 0.001 4 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 0.001 4 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 0.001 4 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefpodoxime" "Table 2A" "10ug" 21 17 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefpodoxime" "Table 2A" 2 8 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefprozil" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefprozil" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ceftaroline" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ceftaroline" "Table 2A" 0.5 2 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ceftriaxone" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ceftriaxone" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Parenteral" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2022" "MIC" "Parenteral" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Ceftriaxone" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "Gemella" 3 "Ceftriaxone" "M45 Table 8" 1 4 FALSE +"CLSI 2022" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ceftriaxone" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ceftriaxone" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Ceftriaxone" "M45 Table 12" 1 4 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Ceftriaxone" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Ceftriaxone" "Table 2F" "30ug" 35 6 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Ceftriaxone" "Table 2I" "30ug" 34 6 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Ceftriaxone" "M45 Table 17" "30ug" 34 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Ceftriaxone" "M45 Table 17" 0.125 2048 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Ceftriaxone" "Table 2H-1" "30ug" 24 6 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Urine" "Enterobacterales" 5 "Ceftibuten" "Table 2A" "30ug" 21 17 TRUE +"CLSI 2022" "MIC" "Urine" "Enterobacterales" 5 "Ceftibuten" "Table 2A" 8 32 TRUE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefotetan" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefotetan" "Table 2A" 16 64 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefotaxime" "Table 2A" "30ug" 26 22 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefotaxime" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Parenteral" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Cefotaxime" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "Gemella" 3 "Cefotaxime" "M45 Table 8" 1 4 FALSE +"CLSI 2022" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefotaxime" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefotaxime" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Cefotaxime" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Cefotaxime" "Table 2F" "30ug" 31 6 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Cefotaxime" "Table 2I" "30ug" 34 6 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Cefotaxime" "Table 2H-1" "30ug" 24 6 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Cefotaxime" "M45 Table 20" "30ug" 26 22 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Cefotaxime" "M45 Table 20" 1 4 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Parenteral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "DISK" "Oral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" "30ug" 23 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "Oral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" 4 32 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 3" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2022" "MIC" "Oral" "Moraxella catarrhalis" 2 "Cefuroxime" "M45 Table 16" 4 16 FALSE +"CLSI 2022" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2022" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Cefuroxime" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Cefuroxime" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ceftazidime/avibactam" "Table 2A" "30ug/20ug" 21 20 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ceftazidime/avibactam" "Table 2A" 8 16 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 21 20 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE +"CLSI 2022" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefazolin" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2022" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefazolin" "Table 2A" 2 8 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Cefazolin" "M45 Table 20" 2 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ceftolozane/tazobactam" "Table 2A" "30ug/10ug" 22 18 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ceftolozane/tazobactam" "Table 2A" 2 8 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ceftolozane/tazobactam" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ceftolozane/tazobactam" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Table 2B-1" "30/10" 21 16 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Table 2B-1" 4 16 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ceftizoxime" "Table 2A" "30ug" 25 21 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ceftizoxime" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Enterococcus faecalis" 2 "Dalbavancin" "Table 2D" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Daptomycin" "Table 2D" 2 8 FALSE +"CLSI 2022" "MIC" "Enterococcus faecium" 2 "Daptomycin" "Table 2D" 0.001 8 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Daptomycin" "M45 Table 11" 4 2048 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Doripenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Doripenem" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Doripenem" "M45 Table 3" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Doripenem" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Doripenem" "Table 2E" "10ug" 16 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Doripenem" "Table 2E" "10ug" 16 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Doxycycline" "Table 2A" "30ug" 14 10 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Doxycycline" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2022" "MIC" "Brucella" 3 "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2022" "MIC" "Burkholderia mallei" 2 "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "MIC" "Burkholderia pseudomallei" 2 "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 5" 2 8 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2022" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 17" "30ug" 23 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "Urine" "Enterobacterales" 5 "Enoxacin" "Table 2A" "10ug" 18 14 TRUE +"CLSI 2022" "MIC" "Urine" "Enterobacterales" 5 "Enoxacin" "Table 2A" 2 8 TRUE +"CLSI 2022" "DISK" "Urine" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 TRUE +"CLSI 2022" "MIC" "Urine" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 TRUE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 4" 0.5 8 FALSE +"CLSI 2022" "DISK" "Campylobacter" 3 "Erythromycin" "M45 Table 5" 16 12 FALSE +"CLSI 2022" "MIC" "Campylobacter" 3 "Erythromycin" "M45 Table 5" 8 32 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2022" "MIC" "Gemella" 3 "Erythromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Erythromycin" "M45 Table 11" 0.5 8 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Erythromycin" "M45 Table 12" 0.5 8 FALSE +"CLSI 2022" "MIC" "Micrococcus" 3 "Erythromycin" "M45 Table 15" 0.5 8 FALSE +"CLSI 2022" "DISK" "Moraxella catarrhalis" 2 "Erythromycin" "M45 Table 16" "15ug" 21 6 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Erythromycin" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "MIC" "Paenibacillus mucilaginosus" 2 "Erythromycin" "M45 Table 19" 0.5 8 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Erythromycin" "M45 Table 17" "15ug" 27 24 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Erythromycin" "M45 Table 17" 0.5 2 FALSE +"CLSI 2022" "MIC" "Rothia mucilaginosa" 2 "Erythromycin" "M45 Table 19" 0.5 8 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Erythromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ertapenem" "Table 2A" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ertapenem" "Table 2A" 0.5 2 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 3" 0.5 2 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefiderocol" "Table 2A" "30ug" 16 8 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefiderocol" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "Acinetobacter" 3 "Cefiderocol" "Table 2B-2" "30ug" 15 6 FALSE +"CLSI 2022" "MIC" "Parenteral" "Acinetobacter" 3 "Cefiderocol" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "Pseudomonas aeruginosa" 2 "Cefiderocol" "Table 2B-1" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "Parenteral" "Pseudomonas aeruginosa" 2 "Cefiderocol" "Table 2B-1" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "Stenotrophomonas maltophilia" 2 "Cefiderocol" "Table 2B-4" "30ug" 15 6 FALSE +"CLSI 2022" "MIC" "Parenteral" "Stenotrophomonas maltophilia" 2 "Cefiderocol" "Table 2B-4" 1 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefepime" "Table 2A" "30ug" 25 18 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefepime" "Table 2A" 2 16 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Parenteral" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Cefepime" "M45 Table 3" 2 16 FALSE +"CLSI 2022" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Cefepime" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Cefepime" "Table 2E" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Cefepime" "Table 2F" "30ug" 31 6 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Parenteral" "Pseudomonas aeruginosa" 2 "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "Pseudomonas aeruginosa" 2 "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Cefepime" "Table 2H-1" "30ug" 24 6 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Cefepime" "M45 Table 20" "30ug" 25 18 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Cefepime" "M45 Table 20" 2 16 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Fleroxacin" "Table 2A" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Fleroxacin" "Table 2A" 2 8 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2022" "DISK" "Candida" 3 "Fluconazole" "Table 1" 50 14 FALSE +"CLSI 2022" "MIC" "Candida" 3 "Fluconazole" "Table 1" 0.001 64 FALSE +"CLSI 2022" "DISK" "Candida albicans" 2 "Fluconazole" "Table 1" 17 13 FALSE +"CLSI 2022" "MIC" "Candida albicans" 2 "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Candida parapsilosis" 2 "Fluconazole" "Table 1" 17 13 FALSE +"CLSI 2022" "MIC" "Candida parapsilosis" 2 "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Candida tropicalis" 2 "Fluconazole" "Table 1" 17 13 FALSE +"CLSI 2022" "MIC" "Candida tropicalis" 2 "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2022" "DISK" "Escherichia coli" 2 "Fosfomycin" "Table 2A" "200ug" 16 12 FALSE +"CLSI 2022" "MIC" "Escherichia coli" 2 "Fosfomycin" "Table 2A" 64 256 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefoxitin" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefoxitin" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Cefoxitin" "M45 Table 3" 8 32 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2022" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "Staphylococcus epidermidis" 2 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2022" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2022" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Cefoxitin" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Cefoxitin" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Gatifloxacin" "Table 2A" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Gatifloxacin" "Table 2A" 2 8 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Gatifloxacin" "Table 2E" "5ug" 18 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Gatifloxacin" "Table 2E" "5ug" 18 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Gatifloxacin" "Table 2C" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Gatifloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2022" "DISK" "Klebsiella pneumoniae" 2 "Gemifloxacin" "Table 2A" "5ug" 20 15 FALSE +"CLSI 2022" "MIC" "Klebsiella pneumoniae" 2 "Gemifloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Gentamicin" "Table 2A" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Gentamicin" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 4" 4 16 FALSE +"CLSI 2022" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2022" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 11" 4 16 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Gentamicin" "M45 Table 20" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Gentamicin" "M45 Table 20" 4 16 FALSE +"CLSI 2022" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Grepafloxacin" "Table 2A" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Grepafloxacin" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Imipenem/relebactam" "Table 2A" "10/25ug" 25 20 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Imipenem/relebactam" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem/relebactam" "Table 2B-1" "10/25ug" 23 19 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem/relebactam" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Imipenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Imipenem" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Imipenem" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Imipenem" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Imipenem" "M45 Table 4" 4 16 FALSE +"CLSI 2022" "MIC" "Burkholderia mallei" 2 "Imipenem" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "MIC" "Burkholderia pseudomallei" 2 "Imipenem" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Imipenem" "Table 2E" "10ug" 16 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Imipenem" "Table 2E" "10ug" 16 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Imipenem" "M45 Table 11" 0.5 2 FALSE +"CLSI 2022" "MIC" "Pediococcus" 3 "Imipenem" "M45 Table 18" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Imipenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Imipenem" "M45 Table 20" 1 4 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Kanamycin" "Table 2A" "30ug" 18 13 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Kanamycin" "Table 2A" 16 64 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Lefamulin" "Table 2E" "20ug" 18 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Lefamulin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Lefamulin" "Table 2E" "20ug" 18 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Lefamulin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus aureus" 2 "Lefamulin" "Table 2C" "20ug" 23 6 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Lefamulin" "Table 2C" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Lefamulin" "Table 2C" "20ug" 23 6 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Lefamulin" "Table 2C" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Lefamulin" "Table 2G" "20ug" 19 6 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Lefamulin" "Table 2G" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Linezolid" "M45 Table 2" 2 2048 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Linezolid" "M45 Table 11" 4 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Linezolid" "Table 2H-1" "30ug" 21 6 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" "30ug" 21 6 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Lomefloxacin" "Table 2A" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Lomefloxacin" "Table 2A" 2 8 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Urine" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" "10ug" 22 18 TRUE +"CLSI 2022" "MIC" "Urine" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 TRUE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Loracarbef" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Loracarbef" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Latamoxef" "Table 2A" "30ug" 23 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Latamoxef" "Table 2A" 8 64 FALSE +"CLSI 2022" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Levofloxacin" "Table 2A" "5ug" 21 16 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Levofloxacin" "Table 2A" 0.5 2 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Levofloxacin" "M45 Table 3" 2 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Levofloxacin" "M45 Table 4" 2 8 FALSE +"CLSI 2022" "MIC" "Bacillus anthracis" 2 "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Burkholderia cepacia" 2 "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2022" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Gemella" 3 "Levofloxacin" "M45 Table 8" 2 8 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Levofloxacin" "M45 Table 12" 2 8 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Levofloxacin" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2022" "MIC" "Paenibacillus mucilaginosus" 2 "Levofloxacin" "M45 Table 19" 1 4 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Levofloxacin" "Table 2B-1" "5ug" 22 14 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Levofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Levofloxacin" "M45 Table 17" "5ug" 28 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Levofloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2022" "MIC" "Rothia mucilaginosa" 2 "Levofloxacin" "M45 Table 19" 1 4 FALSE +"CLSI 2022" "MIC" "Extraintestinal" "Salmonella" 3 "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2022" "DISK" "Stenotrophomonas maltophilia" 2 "Levofloxacin" "Table 2B-4" "75ug" 17 13 FALSE +"CLSI 2022" "MIC" "Stenotrophomonas maltophilia" 2 "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Levofloxacin" "Table 2C" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Levofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Levofloxacin" "M45 Table 20" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Levofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2022" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Cefamandole" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Cefamandole" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "Urine" "Escherichia coli" 2 "Mecillinam" "Table 2A" "10ug" 15 11 TRUE +"CLSI 2022" "MIC" "Urine" "Escherichia coli" 2 "Mecillinam" "Table 2A" 8 32 TRUE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Meropenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Meropenem" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Meropenem" "M45 Table 2" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Meropenem" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Meropenem" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Meropenem" "M45 Table 4" 4 16 FALSE +"CLSI 2022" "DISK" "Burkholderia cepacia" 2 "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2022" "MIC" "Burkholderia cepacia" 2 "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "Gemella" 3 "Meropenem" "M45 Table 8" 0.5 2 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Meropenem" "Table 2E" "10ug" 20 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Meropenem" "Table 2E" "10ug" 20 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Meropenem" "M45 Table 11" 1 4 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Meropenem" "M45 Table 12" 0.25 1 FALSE +"CLSI 2022" "MIC" "Listeria monocytogenes" 2 "Meropenem" "M45 Table 14" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Meropenem" "Table 2I" "10ug" 30 6 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Meropenem" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Meropenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Meropenem" "M45 Table 20" 1 4 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Meropenem/vaborbactam" "Table 2A" "20ug/10ug" 18 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Meropenem/vaborbactam" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Moxifloxacin" "Table 2E" "5ug" 18 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Moxifloxacin" "Table 2E" "5ug" 18 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Moxifloxacin" "M45 Table 17" "5ug" 28 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Moxifloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Candida" 3 "Micafungin" "Table 1" 30 27 FALSE +"CLSI 2022" "MIC" "Candida" 3 "Micafungin" "Table 1" 0.064 0.25 FALSE +"CLSI 2022" "DISK" "Candida albicans" 2 "Micafungin" "Table 1" 22 19 FALSE +"CLSI 2022" "MIC" "Candida albicans" 2 "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Candida krusei" 2 "Micafungin" "Table 1" 22 19 FALSE +"CLSI 2022" "MIC" "Candida krusei" 2 "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Candida parapsilosis" 2 "Micafungin" "Table 1" 16 13 FALSE +"CLSI 2022" "MIC" "Candida parapsilosis" 2 "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Candida tropicalis" 2 "Micafungin" "Table 1" 22 19 FALSE +"CLSI 2022" "MIC" "Candida tropicalis" 2 "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Meyerozyma guilliermondii" 2 "Micafungin" "Table 1" 16 13 FALSE +"CLSI 2022" "MIC" "Meyerozyma guilliermondii" 2 "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "Pichia" 3 "Micafungin" "Table 1" 22 19 FALSE +"CLSI 2022" "MIC" "Pichia" 3 "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Minocycline" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Minocycline" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "DISK" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "MIC" "Leuconostoc" 3 "Minocycline" "M45 Table 13" 4 16 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Minocycline" "Table 2I" "30ug" 26 6 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2022" "DISK" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2022" "DISK" "Urine" "Enterobacterales" 5 "Nalidixic acid" "Table 2A" "30ug" 19 13 TRUE +"CLSI 2022" "MIC" "Urine" "Enterobacterales" 5 "Nalidixic acid" "Table 2A" 16 32 TRUE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Netilmicin" "Table 2A" "30ug" 15 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Netilmicin" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Nitrofurantoin" "Table 2A" "300ug" 17 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Nitrofurantoin" "Table 2A" 32 128 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2022" "DISK" "Urine" "Enterobacterales" 5 "Norfloxacin" "Table 2A" "10ug" 17 12 TRUE +"CLSI 2022" "MIC" "Urine" "Enterobacterales" 5 "Norfloxacin" "Table 2A" 4 16 TRUE +"CLSI 2022" "DISK" "Urine" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 TRUE +"CLSI 2022" "MIC" "Urine" "Enterococcus" 3 "Norfloxacin" "Table 2D" 4 16 TRUE +"CLSI 2022" "MIC" "Urine" "(unknown Gram-negatives)" 2 "Norfloxacin" "Table 2B-5" 4 16 TRUE +"CLSI 2022" "DISK" "Urine" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" "10ug" 17 12 TRUE +"CLSI 2022" "MIC" "Urine" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" 4 16 TRUE +"CLSI 2022" "DISK" "Urine" "Staphylococcus" 3 "Norfloxacin" "Table 2C" "10ug" 17 12 TRUE +"CLSI 2022" "MIC" "Urine" "Staphylococcus" 3 "Norfloxacin" "Table 2C" 4 16 TRUE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ofloxacin" "Table 2A" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ofloxacin" "Table 2A" 2 8 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "MIC" "Extraintestinal" "Salmonella" 3 "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Ofloxacin" "M45 Table 20" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Ofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Oritavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Oritavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2022" "DISK" "Staphylococcus epidermidis" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2022" "MIC" "Staphylococcus epidermidis" 2 "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2022" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2022" "DISK" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2022" "MIC" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2022" "DISK" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2022" "MIC" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE +"CLSI 2022" "DISK" "Salmonella" 3 "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Benzylpenicillin" "M45 Table 2" 0.125 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Benzylpenicillin" "M45 Table 4" 0.125 0.25 FALSE +"CLSI 2022" "MIC" "Bacillus anthracis" 2 "Benzylpenicillin" "M45 Table 21" 0.5 1 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Benzylpenicillin" "Table 2D" "10units" 15 14 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2022" "MIC" "Gemella" 3 "Benzylpenicillin" "M45 Table 8" 0.125 4 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Leuconostoc" 3 "Benzylpenicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Benzylpenicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Benzylpenicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2022" "MIC" "Listeria monocytogenes" 2 "Benzylpenicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2022" "MIC" "Micrococcus" 3 "Benzylpenicillin" "M45 Table 15" 0.125 0.25 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "Table 2F" "10units" 47 26 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2022" "MIC" "Pediococcus" 3 "Benzylpenicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2022" "MIC" "Paenibacillus mucilaginosus" 2 "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Benzylpenicillin" "M45 Table 17" "10 Units" 25 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Benzylpenicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Rothia mucilaginosa" 2 "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Benzylpenicillin" "Table 2C" "10ug" 29 28 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Table 2H-1" "10units" 24 6 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Benzylpenicillin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2022" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2022" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Piperacillin" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Piperacillin" "M45 Table 20" "100ug" 21 17 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Piperacillin" "M45 Table 20" 16 128 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Polymyxin B" "Table 2A" 0.001 4 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 0.001 4 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 0.001 8 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2022" "DISK" "Staphylococcus aureus" 2 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 4" 1 4 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Rifampicin" "M45 Table 16" 1 4 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ampicillin/sulbactam" "Table 2A" "10ug/10ug" 15 11 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ampicillin/sulbactam" "Table 2A" 16 32 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Ampicillin/sulbactam" "Table 2E" "10/10ug" 20 19 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Ampicillin/sulbactam" "Table 2E" "10/10ug" 20 19 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Ampicillin/sulbactam" "M45 Table 20" "10ug" 15 11 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Ampicillin/sulbactam" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Sulfamethoxazole" "Table 2A" "200 - 300ug" 17 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Sulfamethoxazole" "Table 2A" 256 512 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200-300ug" 17 12 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Sulfamethoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Sulfisoxazole" "Table 2A" "200 - 300ug" 17 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Sulfisoxazole" "Table 2A" 256 512 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200-300ug" 17 12 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Sulfisoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Sulfonamide" "Table 2A" "200 - 300ug" 17 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Sulfonamide" "Table 2A" 256 512 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Sulfonamide" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Sulfonamide" "M45 Table 20" 256 512 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Streptoduocin" "Table 2A" "10ug" 15 11 FALSE +"CLSI 2022" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2022" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2022" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Table 2A" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Table 2A" 2 4 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 4" 2 4 FALSE +"CLSI 2022" "MIC" "Brucella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 2048 FALSE +"CLSI 2022" "DISK" "Burkholderia cepacia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "Burkholderia cepacia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2022" "MIC" "Burkholderia pseudomallei" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 12" 2 4 FALSE +"CLSI 2022" "MIC" "Listeria monocytogenes" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" 0.5 4 FALSE +"CLSI 2022" "DISK" "Neisseria meningitidis" 2 "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2022" "MIC" "Neisseria meningitidis" 2 "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2022" "MIC" "Paenibacillus mucilaginosus" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 17" "1.25ug/23.75ug" 24 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Rothia mucilaginosa" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE +"CLSI 2022" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-4" "30ug" 16 10 FALSE +"CLSI 2022" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 20" "1.25ug" 16 10 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 20" 2 4 FALSE +"CLSI 2022" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Ticarcillin/clavulanic acid" "Table 2A" "75ug/10ug" 20 14 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Ticarcillin/clavulanic acid" "Table 2A" 16 128 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2022" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2022" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Tetracycline" "Table 2A" "30ug" 15 11 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Tetracycline" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Tetracycline" "M45 Table 2" 2 8 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2022" "MIC" "Aggregatibacter" 3 "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Tetracycline" "M45 Table 4" 4 16 FALSE +"CLSI 2022" "MIC" "Brucella" 3 "Tetracycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2022" "MIC" "Burkholderia mallei" 2 "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "MIC" "Burkholderia pseudomallei" 2 "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "Campylobacter" 3 "Tetracycline" "M45 Table 5" 26 22 FALSE +"CLSI 2022" "MIC" "Campylobacter" 3 "Tetracycline" "M45 Table 5" 4 16 FALSE +"CLSI 2022" "MIC" "Cardiobacterium" 3 "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "Eikenella corrodens" 2 "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2022" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2022" "MIC" "Kingella" 3 "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2022" "DISK" "Moraxella catarrhalis" 2 "Tetracycline" "M45 Table 16" "30ug" 29 24 FALSE +"CLSI 2022" "MIC" "Moraxella catarrhalis" 2 "Tetracycline" "M45 Table 16" 2 8 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2022" "DISK" "Pasteurella" 3 "Tetracycline" "M45 Table 17" "30ug" 23 6 FALSE +"CLSI 2022" "MIC" "Pasteurella" 3 "Tetracycline" "M45 Table 17" 1 2048 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Tetracycline" "M45 Table 20" "30ug" 15 11 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Tetracycline" "M45 Table 20" 4 16 FALSE +"CLSI 2022" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Telavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Telavancin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Telavancin" "Table 2H-2" 0.125 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Trimethoprim" "Table 2A" "5ug" 16 10 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Trimethoprim" "Table 2A" 8 16 FALSE +"CLSI 2022" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Tobramycin" "Table 2A" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Tobramycin" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE +"CLSI 2022" "MIC" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Tedizolid" "Table 2D" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Tedizolid" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tedizolid" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2022" "DISK" "Enterobacterales" 5 "Piperacillin/tazobactam" "Table 2A" "100ug/10ug" 25 20 FALSE +"CLSI 2022" "MIC" "Enterobacterales" 5 "Piperacillin/tazobactam" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "Acinetobacter" 3 "Piperacillin/tazobactam" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2022" "MIC" "Acinetobacter" 3 "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2022" "DISK" "Aeromonas" 3 "Piperacillin/tazobactam" "M45 Table 2" "100ug" 21 17 FALSE +"CLSI 2022" "MIC" "Aeromonas" 3 "Piperacillin/tazobactam" "M45 Table 3" 16 128 FALSE +"CLSI 2022" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2022" "DISK" "Haemophilus influenzae" 2 "Piperacillin/tazobactam" "Table 2E" "100ug" 21 6 FALSE +"CLSI 2022" "MIC" "Haemophilus influenzae" 2 "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2022" "DISK" "Haemophilus parainfluenzae" 2 "Piperacillin/tazobactam" "Table 2E" "100ug" 21 6 FALSE +"CLSI 2022" "MIC" "Haemophilus parainfluenzae" 2 "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2022" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2022" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2022" "DISK" "Vibrio" 3 "Piperacillin/tazobactam" "M45 Table 20" "100ug" 21 17 FALSE +"CLSI 2022" "MIC" "Vibrio" 3 "Piperacillin/tazobactam" "M45 Table 20" 16 128 FALSE +"CLSI 2022" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2022" "MIC" "Aerococcus" 3 "Vancomycin" "M45 Table 2" 1 2048 FALSE +"CLSI 2022" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 4" 4 2048 FALSE +"CLSI 2022" "MIC" "Cutibacterium acnes" 2 "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2022" "DISK" "Enterococcus" 3 "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "Enterococcus" 3 "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2022" "MIC" "Gemella" 3 "Vancomycin" "M45 Table 8" 1 2048 FALSE +"CLSI 2022" "MIC" "Granulicatella" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2022" "MIC" "Lactobacillus" 3 "Vancomycin" "M45 Table 11" 2 16 FALSE +"CLSI 2022" "MIC" "Lactococcus" 3 "Vancomycin" "M45 Table 12" 2 4 FALSE +"CLSI 2022" "MIC" "Micrococcus" 3 "Vancomycin" "M45 Table 15" 2 2048 FALSE +"CLSI 2022" "MIC" "Paenibacillus mucilaginosus" 2 "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2022" "MIC" "Rothia mucilaginosa" 2 "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2022" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2022" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2022" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2022" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE +"CLSI 2022" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE +"CLSI 2022" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" "30ug" 17 6 FALSE +"CLSI 2022" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2022" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE +"CLSI 2022" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2022" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2022" "MIC" "Aspergillus fumigatus" 2 "Voriconazole" "M61 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Candida albicans" 2 "Voriconazole" "Table 1" 17 14 FALSE +"CLSI 2022" "MIC" "Candida albicans" 2 "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2022" "DISK" "Candida krusei" 2 "Voriconazole" "Table 1" 15 12 FALSE +"CLSI 2022" "MIC" "Candida krusei" 2 "Voriconazole" "Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "Candida parapsilosis" 2 "Voriconazole" "Table 1" 17 14 FALSE +"CLSI 2022" "MIC" "Candida parapsilosis" 2 "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2022" "DISK" "Candida tropicalis" 2 "Voriconazole" "Table 1" 17 14 FALSE +"CLSI 2022" "MIC" "Candida tropicalis" 2 "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2022" "DISK" "Pichia" 3 "Voriconazole" "Table 1" 15 12 FALSE +"CLSI 2022" "MIC" "Pichia" 3 "Voriconazole" "Table 1" 0.5 2 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Amoxicillin/clavulanic acid" "Table 2A" "20ug/10ug" 18 13 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Amoxicillin/clavulanic acid" "Table 2A" 8 32 FALSE "CLSI 2021" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug" 18 13 FALSE @@ -7450,8 +9698,6 @@ "CLSI 2021" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Amoxicillin/clavulanic acid" "M45 Table 20" "20ug" 18 13 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Amoxicillin/clavulanic acid" "M45 Table 20" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Amikacin" "Table 2A" "30ug" 17 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Amikacin" "Table 2A" 16 64 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE @@ -7464,8 +9710,6 @@ "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Amikacin" "M45 Table 20" "30ug" 17 14 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Amikacin" "M45 Table 20" 16 64 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ampicillin" "Table 2A" "10ug" 17 13 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ampicillin" "Table 2A" 8 32 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Ampicillin" "M45 Table 1" 0.25 8 FALSE @@ -7492,8 +9736,7 @@ "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Ampicillin" "M45 Table 20" "10ug" 17 13 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Ampicillin" "M45 Table 20" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2021" "MIC" "Bacillus anthracis" 2 "Amoxicillin" "M45 Table 21" 0.125 0.25 FALSE "CLSI 2021" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 17" 0.5 2048 FALSE "CLSI 2021" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE @@ -7513,10 +9756,6 @@ "CLSI 2021" "MIC" "Haemophilus" 3 "Aztreonam" "Table 2E" 2 2048 FALSE "CLSI 2021" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2021" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE "CLSI 2021" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE "CLSI 2021" "MIC" "Eikenella corrodens" 2 "Azithromycin" "M45 Table 9" 4 2048 FALSE @@ -7544,8 +9783,6 @@ "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Azithromycin" "M45 Table 20" 2 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2021" "MIC" "Candida" 3 "Caspofungin" "Table 1" 0.125 0.5 FALSE "CLSI 2021" "DISK" "Candida albicans" 2 "Caspofungin" "Table 1" 17 14 FALSE "CLSI 2021" "MIC" "Candida albicans" 2 "Caspofungin" "Table 1" 0.25 1 FALSE @@ -7563,8 +9800,6 @@ "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefetamet" "Table 2A" 4 16 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ceftazidime" "Table 2A" "30ug" 21 17 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ceftazidime" "Table 2A" 4 16 FALSE "CLSI 2021" "DISK" "Parenteral" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE @@ -7584,36 +9819,26 @@ "CLSI 2021" "MIC" "Parenteral" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Ceftazidime" "M45 Table 20" "30ug" 21 17 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Ceftazidime" "M45 Table 20" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefdinir" "Table 2A" "5ug" 20 16 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefdinir" "Table 2A" 1 4 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefaclor" "Table 2A" "30ug" 18 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefaclor" "Table 2A" 8 32 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2021" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 16" 8 32 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefixime" "Table 2A" "5ug" 19 15 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefixime" "Table 2A" 1 4 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2021" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2021" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefoperazone" "Table 2A" "75ug" 21 15 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefoperazone" "Table 2A" 16 64 FALSE "CLSI 2021" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Chloramphenicol" "Table 2A" "30ug" 18 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Chloramphenicol" "Table 2A" 8 32 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE @@ -7626,7 +9851,7 @@ "CLSI 2021" "MIC" "Eikenella corrodens" 2 "Chloramphenicol" "M45 Table 9" 4 16 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2021" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 21" 8 2048 FALSE +"CLSI 2021" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 21" 8 2048 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2021" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -7651,18 +9876,13 @@ "CLSI 2021" "DISK" "Vibrio" 3 "Chloramphenicol" "M45 Table 20" "30ug" 18 12 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Chloramphenicol" "M45 Table 20" 8 32 FALSE "CLSI 2021" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 21" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefonicid" "Table 2A" "30ug" 18 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefonicid" "Table 2A" 8 32 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE "CLSI 2021" "DISK" "Urine" "Enterobacterales" 5 "Cinoxacin" "Table 2A" "100ug" 19 14 TRUE "CLSI 2021" "MIC" "Urine" "Enterobacterales" 5 "Cinoxacin" "Table 2A" 16 64 TRUE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ciprofloxacin" "Table 2A" "5ug" 26 21 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ciprofloxacin" "Table 2A" 0.25 1 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE @@ -7680,7 +9900,7 @@ "CLSI 2021" "MIC" "Eikenella corrodens" 2 "Ciprofloxacin" "M45 Table 9" 1 4 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE -"CLSI 2021" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2021" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -7700,8 +9920,7 @@ "CLSI 2021" "DISK" "Vibrio" 3 "Ciprofloxacin" "M45 Table 20" "5ug" 21 15 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Ciprofloxacin" "M45 Table 20" 1 4 FALSE "CLSI 2021" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 26 21 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 0.25 1 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2021" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 4" 0.5 4 FALSE "CLSI 2021" "MIC" "Gemella" 3 "Clindamycin" "M45 Table 8" 0.25 1 FALSE @@ -7711,6 +9930,7 @@ "CLSI 2021" "MIC" "Micrococcus" 3 "Clindamycin" "M45 Table 15" 0.5 4 FALSE "CLSI 2021" "MIC" "Moraxella catarrhalis" 2 "Clindamycin" "M45 Table 16" 0.5 4 FALSE "CLSI 2021" "MIC" "Paenibacillus mucilaginosus" 2 "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2021" "MIC" "Rothia mucilaginosa" 2 "Clindamycin" "M45 Table 19" 0.5 4 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Clindamycin" "Table 2C" "2ug" 21 14 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Clindamycin" "Table 2C" 0.5 4 FALSE "CLSI 2021" "DISK" "Streptococcus" 3 "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE @@ -7719,8 +9939,7 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2021" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE "CLSI 2021" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE "CLSI 2021" "MIC" "Eikenella corrodens" 2 "Clarithromycin" "M45 Table 9" 8 32 FALSE @@ -7738,17 +9957,11 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefmetazole" "Table 2A" "30ug" 16 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefmetazole" "Table 2A" 16 64 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Colistin" "Table 2A" 0.001 4 FALSE "CLSI 2021" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 0.001 4 FALSE "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 0.001 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 0.001 4 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefpodoxime" "Table 2A" "10ug" 21 17 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefpodoxime" "Table 2A" 2 8 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE @@ -7756,28 +9969,22 @@ "CLSI 2021" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2021" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefprozil" "Table 2A" "30ug" 18 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefprozil" "Table 2A" 8 32 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ceftaroline" "Table 2A" "30ug" 23 19 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ceftaroline" "Table 2A" 0.5 2 FALSE "CLSI 2021" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2021" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2021" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2021" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 8 FALSE "CLSI 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Table 2C" 1 8 FALSE "CLSI 2021" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2021" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2021" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ceftriaxone" "Table 2A" "30ug" 23 19 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ceftriaxone" "Table 2A" 1 4 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Ceftriaxone" "M45 Table 1" 1 4 FALSE @@ -7809,20 +10016,15 @@ "CLSI 2021" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2021" "DISK" "Urine" "Enterobacterales" 5 "Ceftibuten" "Table 2A" "30ug" 21 17 TRUE "CLSI 2021" "MIC" "Urine" "Enterobacterales" 5 "Ceftibuten" "Table 2A" 8 32 TRUE "CLSI 2021" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefotetan" "Table 2A" "30ug" 16 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefotetan" "Table 2A" 16 64 FALSE "CLSI 2021" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2021" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefotaxime" "Table 2A" "30ug" 26 22 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefotaxime" "Table 2A" 1 4 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Cefotaxime" "M45 Table 1" 1 4 FALSE @@ -7853,13 +10055,10 @@ "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Cefotaxime" "M45 Table 20" "30ug" 26 22 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Cefotaxime" "M45 Table 20" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2021" "DISK" "Parenteral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" "30ug" 18 14 FALSE "CLSI 2021" "DISK" "Oral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" "30ug" 23 14 FALSE "CLSI 2021" "MIC" "Parenteral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" 8 32 FALSE @@ -7873,29 +10072,21 @@ "CLSI 2021" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Cefuroxime" "M45 Table 20" "30ug" 18 14 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Cefuroxime" "M45 Table 20" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ceftazidime/avibactam" "Table 2A" "30ug/20ug" 21 20 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ceftazidime/avibactam" "Table 2A" 8 16 FALSE "CLSI 2021" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 21 20 FALSE "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ceftazidime/avibactam" "Generic rules" "30/20ug" 21 20 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftazidime/avibactam" "Generic rules" "30/20ug" 8 16 FALSE "CLSI 2021" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" "30ug" 15 14 TRUE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefazolin" "Table 2A" "30ug" 23 19 FALSE "CLSI 2021" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefazolin" "Table 2A" 2 8 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Cefazolin" "M45 Table 20" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ceftolozane/tazobactam" "Table 2A" "30ug/10ug" 21 17 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ceftolozane/tazobactam" "Table 2A" 2 8 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Ceftolozane/tazobactam" "Table 2E" 0.5 2048 FALSE "CLSI 2021" "DISK" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Table 2B-1" "30/10" 21 16 FALSE "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Table 2B-1" 4 16 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 2 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ceftizoxime" "Table 2A" "30ug" 25 21 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ceftizoxime" "Table 2A" 1 4 FALSE "CLSI 2021" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE @@ -7903,10 +10094,8 @@ "CLSI 2021" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2021" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2021" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2021" "MIC" "Enterococcus faecalis" 2 "Dalbavancin" "Table 2D" 0.25 2048 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Dalbavancin" "Table 2C" 0.25 2048 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Dalbavancin" "Table 2C" 0.25 2048 FALSE "CLSI 2021" "MIC" "Streptococcus" 3 "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE @@ -7916,9 +10105,6 @@ "CLSI 2021" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2021" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 4 8 FALSE "CLSI 2021" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -7927,8 +10113,6 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Doripenem" "Table 2A" "10ug" 23 19 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Doripenem" "Table 2A" 1 4 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE @@ -7942,8 +10126,6 @@ "CLSI 2021" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Doxycycline" "Table 2A" "30ug" 14 10 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Doxycycline" "Table 2A" 4 16 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE @@ -7955,7 +10137,7 @@ "CLSI 2021" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 5" 2 8 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2021" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2021" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 21" 4 2048 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2021" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 17" "30ug" 23 6 FALSE "CLSI 2021" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 17" 0.5 2048 FALSE @@ -7964,16 +10146,10 @@ "CLSI 2021" "DISK" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" "30ug" 28 24 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2021" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 21" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE "CLSI 2021" "DISK" "Urine" "Enterobacterales" 5 "Enoxacin" "Table 2A" "10ug" 18 14 TRUE "CLSI 2021" "MIC" "Urine" "Enterobacterales" 5 "Enoxacin" "Table 2A" 2 8 TRUE "CLSI 2021" "DISK" "Urine" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 TRUE "CLSI 2021" "MIC" "Urine" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 TRUE -"CLSI 2021" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2021" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 4" 0.5 8 FALSE "CLSI 2021" "DISK" "Campylobacter" 3 "Erythromycin" "M45 Table 5" 16 12 FALSE @@ -7990,6 +10166,7 @@ "CLSI 2021" "MIC" "Paenibacillus mucilaginosus" 2 "Erythromycin" "M45 Table 19" 0.5 8 FALSE "CLSI 2021" "DISK" "Pasteurella" 3 "Erythromycin" "M45 Table 17" "15ug" 27 24 FALSE "CLSI 2021" "MIC" "Pasteurella" 3 "Erythromycin" "M45 Table 17" 0.5 2 FALSE +"CLSI 2021" "MIC" "Rothia mucilaginosa" 2 "Erythromycin" "M45 Table 19" 0.5 8 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Erythromycin" "Table 2C" "15ug" 23 13 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Erythromycin" "Table 2C" 0.5 8 FALSE "CLSI 2021" "DISK" "Streptococcus" 3 "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE @@ -7998,8 +10175,7 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ertapenem" "Table 2A" "10ug" 22 18 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ertapenem" "Table 2A" 0.5 2 FALSE "CLSI 2021" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE @@ -8009,8 +10185,6 @@ "CLSI 2021" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefiderocol" "Table 2A" "30ug" 16 11 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefiderocol" "Table 2A" 4 16 FALSE "CLSI 2021" "DISK" "Parenteral" "Acinetobacter" 3 "Cefiderocol" "Table 2B-2" "30ug" 15 10 FALSE @@ -8019,7 +10193,6 @@ "CLSI 2021" "MIC" "Parenteral" "Pseudomonas aeruginosa" 2 "Cefiderocol" "Table 2B-1" 4 16 FALSE "CLSI 2021" "DISK" "Parenteral" "Stenotrophomonas maltophilia" 2 "Cefiderocol" "Table 2B-4" "30ug" 17 12 FALSE "CLSI 2021" "MIC" "Parenteral" "Stenotrophomonas maltophilia" 2 "Cefiderocol" "Table 2B-4" 4 16 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefiderocol" "Generic rules" 4 16 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefepime" "Table 2A" "30ug" 25 18 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefepime" "Table 2A" 2 16 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE @@ -8043,18 +10216,13 @@ "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Cefepime" "M45 Table 20" "30ug" 25 18 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Cefepime" "M45 Table 20" 2 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 25 18 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 2 16 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Fleroxacin" "Table 2A" "5ug" 19 15 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Fleroxacin" "Table 2A" 2 8 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE "CLSI 2021" "DISK" "Candida" 3 "Fluconazole" "Table 1" 50 14 FALSE "CLSI 2021" "MIC" "Candida" 3 "Fluconazole" "Table 1" 0.001 64 FALSE "CLSI 2021" "DISK" "Candida albicans" 2 "Fluconazole" "Table 1" 17 13 FALSE @@ -8074,8 +10242,8 @@ "CLSI 2021" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE "CLSI 2021" "MIC" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" 2 8 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE -"CLSI 2021" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2021" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2021" "DISK" "Staphylococcus epidermidis" 2 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE @@ -8083,8 +10251,6 @@ "CLSI 2021" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Cefoxitin" "M45 Table 20" "30ug" 18 14 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Cefoxitin" "M45 Table 20" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Gatifloxacin" "Table 2A" "5ug" 18 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Gatifloxacin" "Table 2A" 2 8 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE @@ -8106,20 +10272,15 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE -"CLSI 2021" "DISK" "Klebsiella pneumoniae pneumoniae" 1 "Gemifloxacin" "Table 2A" "5ug" 20 15 FALSE -"CLSI 2021" "MIC" "Klebsiella pneumoniae pneumoniae" 1 "Gemifloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2021" "DISK" "Klebsiella pneumoniae" 2 "Gemifloxacin" "Table 2A" "5ug" 20 15 FALSE +"CLSI 2021" "MIC" "Klebsiella pneumoniae" 2 "Gemifloxacin" "Table 2A" 0.25 1 FALSE "CLSI 2021" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Gentamicin" "Table 2A" "10ug" 15 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Gentamicin" "Table 2A" 4 16 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE @@ -8129,7 +10290,7 @@ "CLSI 2021" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 4" 4 16 FALSE "CLSI 2021" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 21" 4 2048 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2021" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2021" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 21" 4 2048 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2021" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 11" 4 16 FALSE "CLSI 2021" "DISK" "Pseudomonas aeruginosa" 2 "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE @@ -8139,8 +10300,6 @@ "CLSI 2021" "DISK" "Vibrio" 3 "Gentamicin" "M45 Table 20" "10ug" 15 12 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Gentamicin" "M45 Table 20" 4 16 FALSE "CLSI 2021" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 21" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Grepafloxacin" "Table 2A" "5ug" 18 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Grepafloxacin" "Table 2A" 1 4 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE @@ -8155,8 +10314,6 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Imipenem/relebactam" "Table 2A" "10/25ug" 25 20 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Imipenem/relebactam" "Table 2A" 1 4 FALSE "CLSI 2021" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem/relebactam" "Table 2B-1" "10/25ug" 23 19 FALSE @@ -8186,16 +10343,13 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Imipenem" "M45 Table 20" "10ug" 23 19 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Imipenem" "M45 Table 20" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Kanamycin" "Table 2A" "30ug" 18 13 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Kanamycin" "Table 2A" 16 64 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Lefamulin" "Table 2E" "20ug" 17 6 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Lefamulin" "Table 2E" 2 2048 FALSE -"CLSI 2021" "DISK" "Staphylococcus aureus aureus" 1 "Lefamulin" "Table 2C" "20ug" 23 6 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Lefamulin" "Table 2C" 0.25 2048 FALSE +"CLSI 2021" "DISK" "Staphylococcus aureus" 2 "Lefamulin" "Table 2C" "20ug" 23 6 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Lefamulin" "Table 2C" 0.25 2048 FALSE "CLSI 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Lefamulin" "Table 2C" "20ug" 23 6 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Lefamulin" "Table 2C" 0.25 2048 FALSE "CLSI 2021" "DISK" "Streptococcus pneumoniae" 2 "Lefamulin" "Table 2G" "20ug" 17 6 FALSE @@ -8212,8 +10366,6 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Lomefloxacin" "Table 2A" "10ug" 22 18 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Lomefloxacin" "Table 2A" 2 8 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE @@ -8223,20 +10375,14 @@ "CLSI 2021" "MIC" "Urine" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 TRUE "CLSI 2021" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Loracarbef" "Table 2A" "30ug" 18 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Loracarbef" "Table 2A" 8 32 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Latamoxef" "Table 2A" "30ug" 23 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Latamoxef" "Table 2A" 8 64 FALSE "CLSI 2021" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Levofloxacin" "Table 2A" "5ug" 21 16 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Levofloxacin" "Table 2A" 0.5 2 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE @@ -8253,7 +10399,7 @@ "CLSI 2021" "MIC" "Eikenella corrodens" 2 "Levofloxacin" "M45 Table 9" 2 8 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE -"CLSI 2021" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE "CLSI 2021" "MIC" "Gemella" 3 "Levofloxacin" "M45 Table 8" 2 8 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2021" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE @@ -8268,6 +10414,7 @@ "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Levofloxacin" "Table 2B-1" 1 4 FALSE "CLSI 2021" "DISK" "Pasteurella" 3 "Levofloxacin" "M45 Table 17" "5ug" 28 6 FALSE "CLSI 2021" "MIC" "Pasteurella" 3 "Levofloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2021" "MIC" "Rothia mucilaginosa" 2 "Levofloxacin" "M45 Table 19" 1 4 FALSE "CLSI 2021" "MIC" "Extraintestinal" "Salmonella" 3 "Levofloxacin" "Table 2A" 0.125 2 FALSE "CLSI 2021" "DISK" "Stenotrophomonas maltophilia" 2 "Levofloxacin" "Table 2B-4" "75ug" 17 13 FALSE "CLSI 2021" "MIC" "Stenotrophomonas maltophilia" 2 "Levofloxacin" "Table 2B-4" 2 8 FALSE @@ -8282,19 +10429,12 @@ "CLSI 2021" "DISK" "Vibrio" 3 "Levofloxacin" "M45 Table 20" "5ug" 17 13 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Levofloxacin" "M45 Table 20" 2 8 FALSE "CLSI 2021" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 21 16 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 0.5 2 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Cefamandole" "Table 2A" "30ug" 18 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Cefamandole" "Table 2A" 8 32 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 20 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2021" "DISK" "Urine" "Escherichia coli" 2 "Mecillinam" "Table 2A" "10ug" 15 11 TRUE "CLSI 2021" "MIC" "Urine" "Escherichia coli" 2 "Mecillinam" "Table 2A" 8 32 TRUE -"CLSI 2021" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Meropenem" "Table 2A" "10ug" 23 19 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Meropenem" "Table 2A" 1 4 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE @@ -8327,14 +10467,9 @@ "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Meropenem" "M45 Table 20" "10ug" 23 19 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Meropenem" "M45 Table 20" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Meropenem/vaborbactam" "Table 2A" "20ug/10ug" 18 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Meropenem/vaborbactam" "Table 2A" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Meropenem/vaborbactam" "Generic rules" "20/10ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Meropenem/vaborbactam" "Generic rules" "20/10ug" 4 16 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Moxifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Moxifloxacin" "Table 2E" 1 2048 FALSE "CLSI 2021" "DISK" "Pasteurella" 3 "Moxifloxacin" "M45 Table 17" "5ug" 28 6 FALSE @@ -8343,8 +10478,6 @@ "CLSI 2021" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2021" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2021" "DISK" "Candida" 3 "Micafungin" "Table 1" 30 27 FALSE "CLSI 2021" "MIC" "Candida" 3 "Micafungin" "Table 1" 0.064 0.25 FALSE "CLSI 2021" "DISK" "Candida albicans" 2 "Micafungin" "Table 1" 22 19 FALSE @@ -8375,32 +10508,22 @@ "CLSI 2021" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2021" "DISK" "Urine" "Enterobacterales" 5 "Nalidixic acid" "Table 2A" "30ug" 19 13 TRUE "CLSI 2021" "MIC" "Urine" "Enterobacterales" 5 "Nalidixic acid" "Table 2A" 16 32 TRUE "CLSI 2021" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2021" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Netilmicin" "Table 2A" "30ug" 15 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Netilmicin" "Table 2A" 8 32 FALSE "CLSI 2021" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2021" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Nitrofurantoin" "Table 2A" "300ug" 17 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Nitrofurantoin" "Table 2A" 32 128 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2021" "DISK" "Urine" "Enterobacterales" 5 "Norfloxacin" "Table 2A" "10ug" 17 12 TRUE "CLSI 2021" "MIC" "Urine" "Enterobacterales" 5 "Norfloxacin" "Table 2A" 4 16 TRUE "CLSI 2021" "DISK" "Urine" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 TRUE @@ -8428,17 +10551,13 @@ "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Ofloxacin" "M45 Table 20" "5ug" 16 12 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Ofloxacin" "M45 Table 20" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Oritavancin" "Table 2D" 0.125 2048 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Oritavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oritavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2021" "MIC" "Streptococcus" 3 "Oritavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Table 2H-2" 0.25 2048 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 0.5 1 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2021" "DISK" "Staphylococcus epidermidis" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2021" "MIC" "Staphylococcus epidermidis" 2 "Oxacillin" "Table 2C" 0.5 1 FALSE @@ -8448,7 +10567,6 @@ "CLSI 2021" "DISK" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2021" "MIC" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" 0.5 1 FALSE "CLSI 2021" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2021" "DISK" "Salmonella" 3 "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2021" "MIC" "Aerococcus" 3 "Benzylpenicillin" "M45 Table 2" 0.125 4 FALSE @@ -8474,6 +10592,7 @@ "CLSI 2021" "MIC" "Paenibacillus mucilaginosus" 2 "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE "CLSI 2021" "DISK" "Pasteurella" 3 "Benzylpenicillin" "M45 Table 17" "10 Units" 25 6 FALSE "CLSI 2021" "MIC" "Pasteurella" 3 "Benzylpenicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Rothia mucilaginosa" 2 "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Benzylpenicillin" "Table 2C" "10ug" 29 28 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE "CLSI 2021" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Table 2H-1" "10units" 24 6 FALSE @@ -8482,8 +10601,7 @@ "CLSI 2021" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2021" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2021" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Piperacillin" "Table 2A" "100ug" 21 17 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Piperacillin" "Table 2A" 16 128 FALSE @@ -8494,21 +10612,13 @@ "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Piperacillin" "M45 Table 20" "100ug" 21 17 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Piperacillin" "M45 Table 20" 16 128 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Polymyxin B" "Table 2A" 0.001 4 FALSE "CLSI 2021" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 0.001 4 FALSE "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 0.001 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE -"CLSI 2021" "DISK" "Staphylococcus aureus aureus" 1 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2021" "DISK" "Staphylococcus aureus" 2 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE "CLSI 2021" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE "CLSI 2021" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -8517,8 +10627,6 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2021" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE "CLSI 2021" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 4" 1 4 FALSE "CLSI 2021" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE @@ -8535,8 +10643,6 @@ "CLSI 2021" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2021" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ampicillin/sulbactam" "Table 2A" "10ug/10ug" 15 11 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ampicillin/sulbactam" "Table 2A" 16 32 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE @@ -8550,10 +10656,6 @@ "CLSI 2021" "MIC" "Kingella" 3 "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Ampicillin/sulbactam" "M45 Table 20" "10ug" 15 11 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Ampicillin/sulbactam" "M45 Table 20" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Sulfamethoxazole" "Table 2A" "200 - 300ug" 17 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Sulfamethoxazole" "Table 2A" 256 512 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE @@ -8561,8 +10663,6 @@ "CLSI 2021" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200-300ug" 17 12 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Sulfamethoxazole" "M45 Table 20" "200ug" 17 12 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Sulfisoxazole" "Table 2A" "200 - 300ug" 17 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Sulfisoxazole" "Table 2A" 256 512 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE @@ -8570,8 +10670,6 @@ "CLSI 2021" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200-300ug" 17 12 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Sulfisoxazole" "M45 Table 20" "200ug" 17 12 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2021" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2021" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE @@ -8579,8 +10677,6 @@ "CLSI 2021" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2021" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Sulfonamide" "Table 2A" "200 - 300ug" 17 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Sulfonamide" "Table 2A" 256 512 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE @@ -8591,14 +10687,11 @@ "CLSI 2021" "MIC" "Vibrio" 3 "Sulfonamide" "M45 Table 20" 256 512 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Streptoduocin" "Table 2A" "10ug" 15 11 FALSE "CLSI 2021" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 21" 8 2048 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2021" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2021" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 21" 8 2048 FALSE "CLSI 2021" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 21" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Table 2A" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Table 2A" 2 4 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE @@ -8627,6 +10720,7 @@ "CLSI 2021" "MIC" "Paenibacillus mucilaginosus" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE "CLSI 2021" "DISK" "Pasteurella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 17" "1.25ug/23.75ug" 24 6 FALSE "CLSI 2021" "MIC" "Pasteurella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Rothia mucilaginosa" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE "CLSI 2021" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-4" "30ug" 16 10 FALSE "CLSI 2021" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE @@ -8636,8 +10730,6 @@ "CLSI 2021" "DISK" "Vibrio" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 20" "1.25ug" 16 10 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 20" 2 4 FALSE "CLSI 2021" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Ticarcillin/clavulanic acid" "Table 2A" "75ug/10ug" 20 14 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Ticarcillin/clavulanic acid" "Table 2A" 16 128 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE @@ -8647,8 +10739,6 @@ "CLSI 2021" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2021" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Tetracycline" "Table 2A" "30ug" 15 11 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Tetracycline" "Table 2A" 4 16 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE @@ -8667,7 +10757,7 @@ "CLSI 2021" "MIC" "Eikenella corrodens" 2 "Tetracycline" "M45 Table 9" 2 8 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2021" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2021" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 21" 4 2048 FALSE "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -8690,25 +10780,13 @@ "CLSI 2021" "DISK" "Vibrio" 3 "Tetracycline" "M45 Table 20" "30ug" 15 11 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Tetracycline" "M45 Table 20" 4 16 FALSE "CLSI 2021" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 21" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2021" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE "CLSI 2021" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Telavancin" "Table 2D" 0.125 2048 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Telavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2021" "MIC" "Streptococcus" 3 "Telavancin" "Table 2H-1" 0.125 2048 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Telavancin" "Table 2H-2" 0.125 2048 FALSE @@ -8716,8 +10794,6 @@ "CLSI 2021" "MIC" "Enterobacterales" 5 "Trimethoprim" "Table 2A" 8 16 FALSE "CLSI 2021" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2021" "DISK" "Enterobacterales" 5 "Tobramycin" "Table 2A" "10ug" 15 12 FALSE "CLSI 2021" "MIC" "Enterobacterales" 5 "Tobramycin" "Table 2A" 4 16 FALSE "CLSI 2021" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE @@ -8725,10 +10801,6 @@ "CLSI 2021" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2021" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2021" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2021" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2021" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -8740,7 +10812,7 @@ "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Trovafloxacin" "Table 2H-2" 1 4 FALSE "CLSI 2021" "MIC" "Enterococcus" 3 "Tedizolid" "Table 2D" 0.5 2048 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Tedizolid" "Table 2C" 0.5 2 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Tedizolid" "Table 2C" 0.5 2 FALSE "CLSI 2021" "MIC" "Streptococcus" 3 "Tedizolid" "Table 2H-1" 0.5 2048 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tedizolid" "Table 2H-2" 0.25 2048 FALSE @@ -8757,8 +10829,6 @@ "CLSI 2021" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE "CLSI 2021" "DISK" "Vibrio" 3 "Piperacillin/tazobactam" "M45 Table 20" "100ug" 21 17 FALSE "CLSI 2021" "MIC" "Vibrio" 3 "Piperacillin/tazobactam" "M45 Table 20" 16 128 FALSE -"CLSI 2021" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2021" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2021" "MIC" "Aerococcus" 3 "Vancomycin" "M45 Table 2" 1 2048 FALSE "CLSI 2021" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 4" 4 2048 FALSE @@ -8771,8 +10841,9 @@ "CLSI 2021" "MIC" "Lactococcus" 3 "Vancomycin" "M45 Table 12" 2 4 FALSE "CLSI 2021" "MIC" "Micrococcus" 3 "Vancomycin" "M45 Table 15" 2 2048 FALSE "CLSI 2021" "MIC" "Paenibacillus mucilaginosus" 2 "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2021" "MIC" "Rothia mucilaginosa" 2 "Vancomycin" "M45 Table 19" 2 2048 FALSE "CLSI 2021" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2021" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2021" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2021" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2021" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2021" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE @@ -8780,7 +10851,7 @@ "CLSI 2021" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2021" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2021" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2021" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2021" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2021" "MIC" "Aspergillus fumigatus" 2 "Voriconazole" "M61 Table 1" 0.5 2 FALSE "CLSI 2021" "DISK" "Candida albicans" 2 "Voriconazole" "Table 1" 17 14 FALSE "CLSI 2021" "MIC" "Candida albicans" 2 "Voriconazole" "Table 1" 0.125 1 FALSE @@ -8809,8 +10880,6 @@ "CLSI 2020" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Amoxicillin/clavulanic acid" "M45 Table 20" "20ug" 18 13 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Amoxicillin/clavulanic acid" "M45 Table 20" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Amikacin" "Table 2A" "30ug" 17 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Amikacin" "Table 2A" 16 64 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE @@ -8823,8 +10892,6 @@ "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Amikacin" "M45 Table 20" "30ug" 17 14 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Amikacin" "M45 Table 20" 16 64 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ampicillin" "Table 2A" "10ug" 17 13 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ampicillin" "Table 2A" 8 32 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Ampicillin" "M45 Table 1" 0.25 8 FALSE @@ -8851,8 +10918,7 @@ "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Ampicillin" "M45 Table 20" "10ug" 17 13 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Ampicillin" "M45 Table 20" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2020" "MIC" "Bacillus anthracis" 2 "Amoxicillin" "M45 Table 21" 0.125 0.25 FALSE "CLSI 2020" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 17" 0.5 2048 FALSE "CLSI 2020" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE @@ -8872,10 +10938,6 @@ "CLSI 2020" "MIC" "Haemophilus" 3 "Aztreonam" "Table 2E" 2 2048 FALSE "CLSI 2020" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2020" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE "CLSI 2020" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE "CLSI 2020" "MIC" "Eikenella corrodens" 2 "Azithromycin" "M45 Table 9" 4 2048 FALSE @@ -8900,8 +10962,6 @@ "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Azithromycin" "M45 Table 20" 2 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2020" "MIC" "Candida" 3 "Caspofungin" "Table 1" 0.125 0.5 FALSE "CLSI 2020" "DISK" "Candida albicans" 2 "Caspofungin" "Table 1" 17 14 FALSE "CLSI 2020" "MIC" "Candida albicans" 2 "Caspofungin" "Table 1" 0.25 1 FALSE @@ -8919,8 +10979,6 @@ "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefetamet" "Table 2A" 4 16 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ceftazidime" "Table 2A" "30ug" 21 17 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ceftazidime" "Table 2A" 4 16 FALSE "CLSI 2020" "DISK" "Parenteral" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE @@ -8940,36 +10998,26 @@ "CLSI 2020" "MIC" "Parenteral" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Ceftazidime" "M45 Table 20" "30ug" 21 17 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Ceftazidime" "M45 Table 20" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefdinir" "Table 2A" "5ug" 20 16 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefdinir" "Table 2A" 1 4 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefaclor" "Table 2A" "30ug" 18 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefaclor" "Table 2A" 8 32 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2020" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 16" 8 32 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefixime" "Table 2A" "5ug" 19 15 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefixime" "Table 2A" 1 4 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2020" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2020" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefoperazone" "Table 2A" "75ug" 21 15 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefoperazone" "Table 2A" 16 64 FALSE "CLSI 2020" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Chloramphenicol" "Table 2A" "30ug" 18 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Chloramphenicol" "Table 2A" 8 32 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE @@ -8982,7 +11030,7 @@ "CLSI 2020" "MIC" "Eikenella corrodens" 2 "Chloramphenicol" "M45 Table 9" 4 16 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2020" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 21" 8 2048 FALSE +"CLSI 2020" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 21" 8 2048 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2020" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -9007,18 +11055,13 @@ "CLSI 2020" "DISK" "Vibrio" 3 "Chloramphenicol" "M45 Table 20" "30ug" 18 12 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Chloramphenicol" "M45 Table 20" 8 32 FALSE "CLSI 2020" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 21" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefonicid" "Table 2A" "30ug" 18 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefonicid" "Table 2A" 8 32 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE "CLSI 2020" "DISK" "Urine" "Enterobacterales" 5 "Cinoxacin" "Table 2A" "100ug" 19 14 TRUE "CLSI 2020" "MIC" "Urine" "Enterobacterales" 5 "Cinoxacin" "Table 2A" 16 64 TRUE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ciprofloxacin" "Table 2A" "5ug" 26 21 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ciprofloxacin" "Table 2A" 0.25 1 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE @@ -9036,7 +11079,7 @@ "CLSI 2020" "MIC" "Eikenella corrodens" 2 "Ciprofloxacin" "M45 Table 9" 1 4 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE -"CLSI 2020" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2020" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -9056,8 +11099,7 @@ "CLSI 2020" "DISK" "Vibrio" 3 "Ciprofloxacin" "M45 Table 20" "5ug" 21 15 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Ciprofloxacin" "M45 Table 20" 1 4 FALSE "CLSI 2020" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 26 21 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 0.25 1 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2020" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 4" 0.5 4 FALSE "CLSI 2020" "MIC" "Gemella" 3 "Clindamycin" "M45 Table 8" 0.25 1 FALSE @@ -9067,6 +11109,7 @@ "CLSI 2020" "MIC" "Micrococcus" 3 "Clindamycin" "M45 Table 15" 0.5 4 FALSE "CLSI 2020" "MIC" "Moraxella catarrhalis" 2 "Clindamycin" "M45 Table 16" 0.5 4 FALSE "CLSI 2020" "MIC" "Paenibacillus mucilaginosus" 2 "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2020" "MIC" "Rothia mucilaginosa" 2 "Clindamycin" "M45 Table 19" 0.5 4 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Clindamycin" "Table 2C" "2ug" 21 14 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Clindamycin" "Table 2C" 0.5 4 FALSE "CLSI 2020" "DISK" "Streptococcus" 3 "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE @@ -9075,8 +11118,7 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2020" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE "CLSI 2020" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE "CLSI 2020" "MIC" "Eikenella corrodens" 2 "Clarithromycin" "M45 Table 9" 8 32 FALSE @@ -9094,17 +11136,11 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefmetazole" "Table 2A" "30ug" 16 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefmetazole" "Table 2A" 16 64 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Colistin" "Table 2A" 0.001 4 FALSE "CLSI 2020" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 0.001 4 FALSE "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 0.001 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 0.001 4 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefpodoxime" "Table 2A" "10ug" 21 17 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefpodoxime" "Table 2A" 2 8 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE @@ -9112,28 +11148,22 @@ "CLSI 2020" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2020" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefprozil" "Table 2A" "30ug" 18 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefprozil" "Table 2A" 8 32 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ceftaroline" "Table 2A" "30ug" 23 19 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ceftaroline" "Table 2A" 0.5 2 FALSE "CLSI 2020" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2020" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2020" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2020" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 8 FALSE "CLSI 2020" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Table 2C" 1 8 FALSE "CLSI 2020" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2020" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2020" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ceftriaxone" "Table 2A" "30ug" 23 19 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ceftriaxone" "Table 2A" 1 4 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Ceftriaxone" "M45 Table 1" 1 4 FALSE @@ -9165,20 +11195,15 @@ "CLSI 2020" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2020" "DISK" "Urine" "Enterobacterales" 5 "Ceftibuten" "Table 2A" "30ug" 21 17 TRUE "CLSI 2020" "MIC" "Urine" "Enterobacterales" 5 "Ceftibuten" "Table 2A" 8 32 TRUE "CLSI 2020" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefotetan" "Table 2A" "30ug" 16 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefotetan" "Table 2A" 16 64 FALSE "CLSI 2020" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2020" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefotaxime" "Table 2A" "30ug" 26 22 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefotaxime" "Table 2A" 1 4 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Cefotaxime" "M45 Table 1" 1 4 FALSE @@ -9209,13 +11234,10 @@ "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Cefotaxime" "M45 Table 20" "30ug" 26 22 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Cefotaxime" "M45 Table 20" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2020" "DISK" "Parenteral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" "30ug" 18 14 FALSE "CLSI 2020" "DISK" "Oral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" "30ug" 23 14 FALSE "CLSI 2020" "MIC" "Parenteral" "Enterobacterales" 5 "Cefuroxime" "Table 2A" 8 32 FALSE @@ -9229,28 +11251,20 @@ "CLSI 2020" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Cefuroxime" "M45 Table 20" "30ug" 18 14 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Cefuroxime" "M45 Table 20" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ceftazidime/avibactam" "Table 2A" "30ug/20ug" 21 20 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ceftazidime/avibactam" "Table 2A" 8 16 FALSE "CLSI 2020" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 21 20 FALSE "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ceftazidime/avibactam" "Generic rules" "30/20ug" 21 20 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftazidime/avibactam" "Generic rules" "30/20ug" 8 16 FALSE "CLSI 2020" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" "30ug" 15 14 TRUE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefazolin" "Table 2A" "30ug" 23 19 FALSE "CLSI 2020" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefazolin" "Table 2A" 2 8 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Cefazolin" "M45 Table 20" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ceftolozane/tazobactam" "Table 2A" "30ug/10ug" 21 17 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ceftolozane/tazobactam" "Table 2A" 2 8 FALSE "CLSI 2020" "DISK" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Table 2B-1" "30/10" 21 16 FALSE "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Table 2B-1" 4 16 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 2 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ceftizoxime" "Table 2A" "30ug" 25 21 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ceftizoxime" "Table 2A" 1 4 FALSE "CLSI 2020" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE @@ -9258,10 +11272,8 @@ "CLSI 2020" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2020" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2020" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2020" "MIC" "Enterococcus faecalis" 2 "Dalbavancin" "Table 2D" 0.25 2048 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Dalbavancin" "Table 2C" 0.25 2048 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Dalbavancin" "Table 2C" 0.25 2048 FALSE "CLSI 2020" "MIC" "Streptococcus" 3 "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE @@ -9271,9 +11283,6 @@ "CLSI 2020" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2020" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2020" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -9282,8 +11291,6 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Doripenem" "Table 2A" "10ug" 23 19 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Doripenem" "Table 2A" 1 4 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE @@ -9297,8 +11304,6 @@ "CLSI 2020" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Doxycycline" "Table 2A" "30ug" 14 10 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Doxycycline" "Table 2A" 4 16 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE @@ -9310,7 +11315,7 @@ "CLSI 2020" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 5" 2 8 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2020" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2020" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 21" 4 2048 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2020" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 17" "30ug" 23 6 FALSE "CLSI 2020" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 17" 0.5 2048 FALSE @@ -9319,20 +11324,14 @@ "CLSI 2020" "DISK" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" "30ug" 28 24 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2020" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 21" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2020" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2020" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2020" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2020" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2020" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2020" "DISK" "Urine" "Enterobacterales" 5 "Enoxacin" "Table 2A" "10ug" 18 14 TRUE "CLSI 2020" "MIC" "Urine" "Enterobacterales" 5 "Enoxacin" "Table 2A" 2 8 TRUE "CLSI 2020" "DISK" "Urine" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 TRUE "CLSI 2020" "MIC" "Urine" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 TRUE -"CLSI 2020" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2020" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 4" 0.5 8 FALSE "CLSI 2020" "DISK" "Campylobacter" 3 "Erythromycin" "M45 Table 5" 16 12 FALSE @@ -9349,6 +11348,7 @@ "CLSI 2020" "MIC" "Paenibacillus mucilaginosus" 2 "Erythromycin" "M45 Table 19" 0.5 8 FALSE "CLSI 2020" "DISK" "Pasteurella" 3 "Erythromycin" "M45 Table 17" "15ug" 27 24 FALSE "CLSI 2020" "MIC" "Pasteurella" 3 "Erythromycin" "M45 Table 17" 0.5 2 FALSE +"CLSI 2020" "MIC" "Rothia mucilaginosa" 2 "Erythromycin" "M45 Table 19" 0.5 8 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Erythromycin" "Table 2C" "15ug" 23 13 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Erythromycin" "Table 2C" 0.5 8 FALSE "CLSI 2020" "DISK" "Streptococcus" 3 "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE @@ -9357,8 +11357,7 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ertapenem" "Table 2A" "10ug" 22 18 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ertapenem" "Table 2A" 0.5 2 FALSE "CLSI 2020" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE @@ -9368,8 +11367,6 @@ "CLSI 2020" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefiderocol" "Table 2A" "30ug" 16 11 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefiderocol" "Table 2A" 4 16 FALSE "CLSI 2020" "DISK" "Parenteral" "Acinetobacter" 3 "Cefiderocol" "Table 2B-2" "30ug" 15 10 FALSE @@ -9378,7 +11375,6 @@ "CLSI 2020" "MIC" "Parenteral" "Pseudomonas aeruginosa" 2 "Cefiderocol" "Table 2B-1" 4 16 FALSE "CLSI 2020" "DISK" "Parenteral" "Stenotrophomonas maltophilia" 2 "Cefiderocol" "Table 2B-4" "30ug" 17 12 FALSE "CLSI 2020" "MIC" "Parenteral" "Stenotrophomonas maltophilia" 2 "Cefiderocol" "Table 2B-4" 4 16 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefiderocol" "Generic rules" 4 16 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefepime" "Table 2A" "30ug" 25 18 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefepime" "Table 2A" 2 16 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE @@ -9402,18 +11398,13 @@ "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Cefepime" "M45 Table 20" "30ug" 25 18 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Cefepime" "M45 Table 20" 2 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 25 18 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 2 16 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Fleroxacin" "Table 2A" "5ug" 19 15 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Fleroxacin" "Table 2A" 2 8 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE "CLSI 2020" "DISK" "Candida" 3 "Fluconazole" "Table 1" 50 14 FALSE "CLSI 2020" "MIC" "Candida" 3 "Fluconazole" "Table 1" 0.001 64 FALSE "CLSI 2020" "DISK" "Candida albicans" 2 "Fluconazole" "Table 1" 17 13 FALSE @@ -9433,8 +11424,8 @@ "CLSI 2020" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE "CLSI 2020" "MIC" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" 2 8 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE -"CLSI 2020" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2020" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2020" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2020" "DISK" "Staphylococcus epidermidis" 2 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE @@ -9442,8 +11433,6 @@ "CLSI 2020" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Cefoxitin" "M45 Table 20" "30ug" 18 14 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Cefoxitin" "M45 Table 20" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Gatifloxacin" "Table 2A" "5ug" 18 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Gatifloxacin" "Table 2A" 2 8 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE @@ -9465,20 +11454,15 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE -"CLSI 2020" "DISK" "Klebsiella pneumoniae pneumoniae" 1 "Gemifloxacin" "Table 2A" "5ug" 20 15 FALSE -"CLSI 2020" "MIC" "Klebsiella pneumoniae pneumoniae" 1 "Gemifloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2020" "DISK" "Klebsiella pneumoniae" 2 "Gemifloxacin" "Table 2A" "5ug" 20 15 FALSE +"CLSI 2020" "MIC" "Klebsiella pneumoniae" 2 "Gemifloxacin" "Table 2A" 0.25 1 FALSE "CLSI 2020" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Gentamicin" "Table 2A" "10ug" 15 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Gentamicin" "Table 2A" 4 16 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE @@ -9488,7 +11472,7 @@ "CLSI 2020" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 4" 4 16 FALSE "CLSI 2020" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 21" 4 2048 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2020" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2020" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 21" 4 2048 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2020" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 11" 4 16 FALSE "CLSI 2020" "DISK" "Pseudomonas aeruginosa" 2 "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE @@ -9498,8 +11482,6 @@ "CLSI 2020" "DISK" "Vibrio" 3 "Gentamicin" "M45 Table 20" "10ug" 15 12 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Gentamicin" "M45 Table 20" 4 16 FALSE "CLSI 2020" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 21" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Grepafloxacin" "Table 2A" "5ug" 18 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Grepafloxacin" "Table 2A" 1 4 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE @@ -9514,8 +11496,6 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Imipenem" "Table 2A" "10ug" 23 19 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Imipenem" "Table 2A" 1 4 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE @@ -9541,12 +11521,9 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Imipenem" "M45 Table 20" "10ug" 23 19 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Imipenem" "M45 Table 20" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Kanamycin" "Table 2A" "30ug" 18 13 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Kanamycin" "Table 2A" 16 64 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2020" "MIC" "Aerococcus" 3 "Linezolid" "M45 Table 2" 2 2048 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE @@ -9559,8 +11536,6 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Lomefloxacin" "Table 2A" "10ug" 22 18 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Lomefloxacin" "Table 2A" 2 8 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE @@ -9570,20 +11545,14 @@ "CLSI 2020" "MIC" "Urine" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 TRUE "CLSI 2020" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Loracarbef" "Table 2A" "30ug" 18 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Loracarbef" "Table 2A" 8 32 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Latamoxef" "Table 2A" "30ug" 23 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Latamoxef" "Table 2A" 8 64 FALSE "CLSI 2020" "MIC" "Parenteral" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Levofloxacin" "Table 2A" "5ug" 21 16 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Levofloxacin" "Table 2A" 0.5 2 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE @@ -9600,7 +11569,7 @@ "CLSI 2020" "MIC" "Eikenella corrodens" 2 "Levofloxacin" "M45 Table 9" 2 8 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE -"CLSI 2020" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE "CLSI 2020" "MIC" "Gemella" 3 "Levofloxacin" "M45 Table 8" 2 8 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2020" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE @@ -9615,6 +11584,7 @@ "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Levofloxacin" "Table 2B-1" 1 4 FALSE "CLSI 2020" "DISK" "Pasteurella" 3 "Levofloxacin" "M45 Table 17" "5ug" 28 6 FALSE "CLSI 2020" "MIC" "Pasteurella" 3 "Levofloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2020" "MIC" "Rothia mucilaginosa" 2 "Levofloxacin" "M45 Table 19" 1 4 FALSE "CLSI 2020" "MIC" "Extraintestinal" "Salmonella" 3 "Levofloxacin" "Table 2A" 0.125 2 FALSE "CLSI 2020" "DISK" "Stenotrophomonas maltophilia" 2 "Levofloxacin" "Table 2B-4" "75ug" 17 13 FALSE "CLSI 2020" "MIC" "Stenotrophomonas maltophilia" 2 "Levofloxacin" "Table 2B-4" 2 8 FALSE @@ -9629,19 +11599,12 @@ "CLSI 2020" "DISK" "Vibrio" 3 "Levofloxacin" "M45 Table 20" "5ug" 17 13 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Levofloxacin" "M45 Table 20" 2 8 FALSE "CLSI 2020" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 21 16 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 0.5 2 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Cefamandole" "Table 2A" "30ug" 18 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Cefamandole" "Table 2A" 8 32 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 20 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2020" "DISK" "Urine" "Escherichia coli" 2 "Mecillinam" "Table 2A" "10ug" 15 11 TRUE "CLSI 2020" "MIC" "Urine" "Escherichia coli" 2 "Mecillinam" "Table 2A" 8 32 TRUE -"CLSI 2020" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Meropenem" "Table 2A" "10ug" 23 19 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Meropenem" "Table 2A" 1 4 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE @@ -9674,14 +11637,9 @@ "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Meropenem" "M45 Table 20" "10ug" 23 19 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Meropenem" "M45 Table 20" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Meropenem/vaborbactam" "Table 2A" "20ug/10ug" 18 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Meropenem/vaborbactam" "Table 2A" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Meropenem/vaborbactam" "Generic rules" "20/10ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Meropenem/vaborbactam" "Generic rules" "20/10ug" 4 16 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Moxifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Moxifloxacin" "Table 2E" 1 2048 FALSE "CLSI 2020" "DISK" "Pasteurella" 3 "Moxifloxacin" "M45 Table 17" "5ug" 28 6 FALSE @@ -9690,8 +11648,6 @@ "CLSI 2020" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2020" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2020" "DISK" "Candida" 3 "Micafungin" "Table 1" 30 27 FALSE "CLSI 2020" "MIC" "Candida" 3 "Micafungin" "Table 1" 0.064 0.25 FALSE "CLSI 2020" "DISK" "Candida albicans" 2 "Micafungin" "Table 1" 22 19 FALSE @@ -9722,32 +11678,22 @@ "CLSI 2020" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2020" "DISK" "Urine" "Enterobacterales" 5 "Nalidixic acid" "Table 2A" "30ug" 19 13 TRUE "CLSI 2020" "MIC" "Urine" "Enterobacterales" 5 "Nalidixic acid" "Table 2A" 16 32 TRUE "CLSI 2020" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2020" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Netilmicin" "Table 2A" "30ug" 15 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Netilmicin" "Table 2A" 8 32 FALSE "CLSI 2020" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2020" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Nitrofurantoin" "Table 2A" "300ug" 17 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Nitrofurantoin" "Table 2A" 32 128 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2020" "DISK" "Urine" "Enterobacterales" 5 "Norfloxacin" "Table 2A" "10ug" 17 12 TRUE "CLSI 2020" "MIC" "Urine" "Enterobacterales" 5 "Norfloxacin" "Table 2A" 4 16 TRUE "CLSI 2020" "DISK" "Urine" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 TRUE @@ -9775,17 +11721,13 @@ "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Ofloxacin" "M45 Table 20" "5ug" 16 12 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Ofloxacin" "M45 Table 20" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Oritavancin" "Table 2D" 0.125 2048 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Oritavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oritavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2020" "MIC" "Streptococcus" 3 "Oritavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Table 2H-2" 0.25 2048 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 0.25 0.5 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2020" "DISK" "Staphylococcus epidermidis" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2020" "MIC" "Staphylococcus epidermidis" 2 "Oxacillin" "Table 2C" 0.25 0.5 FALSE @@ -9795,7 +11737,6 @@ "CLSI 2020" "DISK" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2020" "MIC" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" 0.25 0.5 FALSE "CLSI 2020" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2020" "DISK" "Salmonella" 3 "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2020" "MIC" "Aerococcus" 3 "Benzylpenicillin" "M45 Table 2" 0.125 4 FALSE @@ -9821,6 +11762,7 @@ "CLSI 2020" "MIC" "Paenibacillus mucilaginosus" 2 "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE "CLSI 2020" "DISK" "Pasteurella" 3 "Benzylpenicillin" "M45 Table 17" "10 Units" 25 6 FALSE "CLSI 2020" "MIC" "Pasteurella" 3 "Benzylpenicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Rothia mucilaginosa" 2 "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Benzylpenicillin" "Table 2C" "10ug" 29 28 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE "CLSI 2020" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Table 2H-1" "10units" 24 6 FALSE @@ -9829,8 +11771,7 @@ "CLSI 2020" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2020" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2020" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Piperacillin" "Table 2A" "100ug" 21 17 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Piperacillin" "Table 2A" 16 128 FALSE @@ -9841,21 +11782,13 @@ "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Piperacillin" "M45 Table 20" "100ug" 21 17 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Piperacillin" "M45 Table 20" 16 128 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Polymyxin B" "Table 2A" 0.001 4 FALSE "CLSI 2020" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 0.001 4 FALSE "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 0.001 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE -"CLSI 2020" "DISK" "Staphylococcus aureus aureus" 1 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2020" "DISK" "Staphylococcus aureus" 2 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE "CLSI 2020" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE "CLSI 2020" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -9864,8 +11797,6 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2020" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE "CLSI 2020" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 4" 1 4 FALSE "CLSI 2020" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE @@ -9882,8 +11813,6 @@ "CLSI 2020" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2020" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ampicillin/sulbactam" "Table 2A" "10ug/10ug" 15 11 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ampicillin/sulbactam" "Table 2A" 16 32 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE @@ -9897,10 +11826,6 @@ "CLSI 2020" "MIC" "Kingella" 3 "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Ampicillin/sulbactam" "M45 Table 20" "10ug" 15 11 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Ampicillin/sulbactam" "M45 Table 20" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Sulfamethoxazole" "Table 2A" "200 - 300ug" 17 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Sulfamethoxazole" "Table 2A" 256 512 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE @@ -9908,8 +11833,6 @@ "CLSI 2020" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Sulfamethoxazole" "M45 Table 20" "200ug" 17 12 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Sulfisoxazole" "Table 2A" "200 - 300ug" 17 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Sulfisoxazole" "Table 2A" 256 512 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE @@ -9917,20 +11840,16 @@ "CLSI 2020" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Sulfisoxazole" "M45 Table 20" "200ug" 17 12 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2020" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2020" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2020" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2020" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2020" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2020" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2020" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Sulfonamide" "Table 2A" "200 - 300ug" 17 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Sulfonamide" "Table 2A" 256 512 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE @@ -9941,14 +11860,11 @@ "CLSI 2020" "MIC" "Vibrio" 3 "Sulfonamide" "M45 Table 20" 256 512 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Streptoduocin" "Table 2A" "10ug" 15 11 FALSE "CLSI 2020" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 21" 8 2048 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2020" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2020" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 21" 8 2048 FALSE "CLSI 2020" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 21" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Table 2A" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Trimethoprim/sulfamethoxazole" "Table 2A" 2 4 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE @@ -9977,6 +11893,7 @@ "CLSI 2020" "MIC" "Paenibacillus mucilaginosus" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE "CLSI 2020" "DISK" "Pasteurella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 17" "1.25ug/23.75ug" 24 6 FALSE "CLSI 2020" "MIC" "Pasteurella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Rothia mucilaginosa" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE "CLSI 2020" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-4" "30ug" 16 10 FALSE "CLSI 2020" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE @@ -9986,8 +11903,6 @@ "CLSI 2020" "DISK" "Vibrio" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 20" "1.25ug" 16 10 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 20" 2 4 FALSE "CLSI 2020" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Ticarcillin/clavulanic acid" "Table 2A" "75ug/10ug" 20 14 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Ticarcillin/clavulanic acid" "Table 2A" 16 128 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE @@ -9997,8 +11912,6 @@ "CLSI 2020" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2020" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Tetracycline" "Table 2A" "30ug" 15 11 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Tetracycline" "Table 2A" 4 16 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE @@ -10017,7 +11930,7 @@ "CLSI 2020" "MIC" "Eikenella corrodens" 2 "Tetracycline" "M45 Table 9" 2 8 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2020" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2020" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 21" 4 2048 FALSE "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -10040,30 +11953,18 @@ "CLSI 2020" "DISK" "Vibrio" 3 "Tetracycline" "M45 Table 20" "30ug" 15 11 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Tetracycline" "M45 Table 20" 4 16 FALSE "CLSI 2020" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 21" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2020" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2020" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2020" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2020" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2020" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2020" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2020" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2020" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Telavancin" "Table 2D" 0.125 2048 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Telavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2020" "MIC" "Streptococcus" 3 "Telavancin" "Table 2H-1" 0.125 2048 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Telavancin" "Table 2H-2" 0.125 2048 FALSE @@ -10071,8 +11972,6 @@ "CLSI 2020" "MIC" "Enterobacterales" 5 "Trimethoprim" "Table 2A" 8 16 FALSE "CLSI 2020" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2020" "DISK" "Enterobacterales" 5 "Tobramycin" "Table 2A" "10ug" 15 12 FALSE "CLSI 2020" "MIC" "Enterobacterales" 5 "Tobramycin" "Table 2A" 4 16 FALSE "CLSI 2020" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE @@ -10080,10 +11979,6 @@ "CLSI 2020" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2020" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2020" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2020" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2020" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -10095,7 +11990,7 @@ "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Trovafloxacin" "Table 2H-2" 1 4 FALSE "CLSI 2020" "MIC" "Enterococcus" 3 "Tedizolid" "Table 2D" 0.5 2048 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Tedizolid" "Table 2C" 0.5 2 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Tedizolid" "Table 2C" 0.5 2 FALSE "CLSI 2020" "MIC" "Streptococcus" 3 "Tedizolid" "Table 2H-1" 0.5 2048 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tedizolid" "Table 2H-2" 0.25 2048 FALSE @@ -10112,8 +12007,6 @@ "CLSI 2020" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE "CLSI 2020" "DISK" "Vibrio" 3 "Piperacillin/tazobactam" "M45 Table 20" "100ug" 21 17 FALSE "CLSI 2020" "MIC" "Vibrio" 3 "Piperacillin/tazobactam" "M45 Table 20" 16 128 FALSE -"CLSI 2020" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2020" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2020" "MIC" "Aerococcus" 3 "Vancomycin" "M45 Table 2" 1 2048 FALSE "CLSI 2020" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 4" 4 2048 FALSE @@ -10126,8 +12019,9 @@ "CLSI 2020" "MIC" "Lactococcus" 3 "Vancomycin" "M45 Table 12" 2 4 FALSE "CLSI 2020" "MIC" "Micrococcus" 3 "Vancomycin" "M45 Table 15" 2 2048 FALSE "CLSI 2020" "MIC" "Paenibacillus mucilaginosus" 2 "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2020" "MIC" "Rothia mucilaginosa" 2 "Vancomycin" "M45 Table 19" 2 2048 FALSE "CLSI 2020" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2020" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2020" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2020" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2020" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2020" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE @@ -10135,7 +12029,7 @@ "CLSI 2020" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2020" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2020" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2020" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2020" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2020" "DISK" "Candida albicans" 2 "Voriconazole" "Table 1" 17 14 FALSE "CLSI 2020" "MIC" "Candida albicans" 2 "Voriconazole" "Table 1" 0.125 1 FALSE "CLSI 2020" "DISK" "Candida krusei" 2 "Voriconazole" "Table 1" 15 12 FALSE @@ -10161,8 +12055,6 @@ "CLSI 2019" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Amoxicillin/clavulanic acid" "M45 Table 20" "20ug" 18 13 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Amoxicillin/clavulanic acid" "M45 Table 20" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE "CLSI 2019" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE @@ -10173,8 +12065,6 @@ "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Amikacin" "M45 Table 20" "30ug" 17 14 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Amikacin" "M45 Table 20" 16 64 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2019" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 9" 1 4 FALSE "CLSI 2019" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 4" 0.25 0.5 FALSE @@ -10199,8 +12089,7 @@ "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Ampicillin" "M45 Table 20" "10ug" 17 13 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Ampicillin" "M45 Table 20" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2019" "MIC" "Bacillus anthracis" 2 "Amoxicillin" "M45 Table 21" 0.125 0.25 FALSE "CLSI 2019" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 17" 0.5 2048 FALSE "CLSI 2019" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE @@ -10218,10 +12107,6 @@ "CLSI 2019" "MIC" "Haemophilus" 3 "Aztreonam" "Table 2E" 2 2048 FALSE "CLSI 2019" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2019" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE "CLSI 2019" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 9" 4 2048 FALSE "CLSI 2019" "MIC" "Eikenella corrodens" 2 "Azithromycin" "M45 Table 9" 4 2048 FALSE @@ -10246,8 +12131,6 @@ "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Azithromycin" "M45 Table 20" 2 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2019" "MIC" "Candida" 3 "Caspofungin" "Table 1" 0.125 0.5 FALSE "CLSI 2019" "DISK" "Candida albicans" 2 "Caspofungin" "Table 1" 17 14 FALSE "CLSI 2019" "MIC" "Candida albicans" 2 "Caspofungin" "Table 1" 0.25 1 FALSE @@ -10263,8 +12146,6 @@ "CLSI 2019" "MIC" "Pichia" 3 "Caspofungin" "Table 1" 0.25 1 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE "CLSI 2019" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE @@ -10282,28 +12163,18 @@ "CLSI 2019" "MIC" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Ceftazidime" "M45 Table 20" "30ug" 21 17 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Ceftazidime" "M45 Table 20" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2019" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 16" 8 32 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2019" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2019" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2019" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE "CLSI 2019" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 3" 8 32 FALSE @@ -10314,7 +12185,7 @@ "CLSI 2019" "MIC" "Eikenella corrodens" 2 "Chloramphenicol" "M45 Table 9" 4 16 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2019" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 21" 8 2048 FALSE +"CLSI 2019" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 21" 8 2048 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2019" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -10339,14 +12210,9 @@ "CLSI 2019" "DISK" "Vibrio" 3 "Chloramphenicol" "M45 Table 20" "30ug" 18 12 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Chloramphenicol" "M45 Table 20" 8 32 FALSE "CLSI 2019" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 21" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE @@ -10362,7 +12228,7 @@ "CLSI 2019" "MIC" "Eikenella corrodens" 2 "Ciprofloxacin" "M45 Table 9" 1 4 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE -"CLSI 2019" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2019" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -10384,8 +12250,7 @@ "CLSI 2019" "DISK" "Vibrio" 3 "Ciprofloxacin" "M45 Table 20" "5ug" 21 15 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Ciprofloxacin" "M45 Table 20" 1 4 FALSE "CLSI 2019" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 26 21 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 0.25 1 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2019" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 4" 0.5 4 FALSE "CLSI 2019" "MIC" "Gemella" 3 "Clindamycin" "M45 Table 8" 0.25 1 FALSE @@ -10395,6 +12260,7 @@ "CLSI 2019" "MIC" "Micrococcus" 3 "Clindamycin" "M45 Table 15" 0.5 4 FALSE "CLSI 2019" "MIC" "Moraxella catarrhalis" 2 "Clindamycin" "M45 Table 16" 0.5 4 FALSE "CLSI 2019" "MIC" "Paenibacillus mucilaginosus" 2 "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2019" "MIC" "Rothia mucilaginosa" 2 "Clindamycin" "M45 Table 19" 0.5 4 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Clindamycin" "Table 2C" "2ug" 21 14 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Clindamycin" "Table 2C" 0.5 4 FALSE "CLSI 2019" "DISK" "Streptococcus" 3 "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE @@ -10403,8 +12269,7 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2019" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE "CLSI 2019" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 9" 8 32 FALSE "CLSI 2019" "MIC" "Eikenella corrodens" 2 "Clarithromycin" "M45 Table 9" 8 32 FALSE @@ -10422,38 +12287,26 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 2 4 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Colistin" "Table 2B-5" 2 8 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 2 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefpodoxime" "Table 2E" 2 2048 FALSE "CLSI 2019" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2019" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2019" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2019" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2019" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE -"CLSI 2019" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2019" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2019" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 8 FALSE "CLSI 2019" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE "CLSI 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Ceftaroline" "Table 2C" 1 8 FALSE "CLSI 2019" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2019" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2019" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Carbenicillin" "Table 2B-5" 16 64 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE @@ -10484,16 +12337,11 @@ "CLSI 2019" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2019" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2019" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE @@ -10522,13 +12370,10 @@ "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Cefotaxime" "M45 Table 20" "30ug" 26 22 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Cefotaxime" "M45 Table 20" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2019" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2019" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 3" 8 32 FALSE "CLSI 2019" "DISK" "Oral" "Haemophilus" 3 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE @@ -10540,33 +12385,23 @@ "CLSI 2019" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Cefuroxime" "M45 Table 20" "30ug" 18 14 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Cefuroxime" "M45 Table 20" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2019" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 21 20 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ceftazidime/avibactam" "Generic rules" "30/20ug" 21 20 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftazidime/avibactam" "Generic rules" "30/20ug" 8 16 FALSE "CLSI 2019" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" "30ug" 15 14 TRUE "CLSI 2019" "DISK" "Enterobacterales" 5 "Cefazolin" "Table 2A" "30ug" 23 19 FALSE "CLSI 2019" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE "CLSI 2019" "MIC" "Enterobacterales" 5 "Cefazolin" "Table 2A" 2 8 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Cefazolin" "M45 Table 20" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2019" "DISK" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Table 2B-1" "30/10" 21 16 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "Table 2B-1" 4 16 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 2 8 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2019" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2019" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2019" "MIC" "Enterococcus faecalis" 2 "Dalbavancin" "Table 2D" 0.25 2048 FALSE -"CLSI 2019" "MIC" "Staphylococcus aureus aureus" 1 "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2019" "MIC" "Staphylococcus aureus" 2 "Dalbavancin" "Table 2C" 0.25 2048 FALSE "CLSI 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Dalbavancin" "Table 2C" 0.25 2048 FALSE "CLSI 2019" "MIC" "Streptococcus" 3 "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE @@ -10576,9 +12411,6 @@ "CLSI 2019" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2019" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2019" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -10587,8 +12419,6 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 2 8 FALSE "CLSI 2019" "DISK" "Aeromonas" 3 "Doripenem" "M45 Table 3" "10ug" 23 19 FALSE @@ -10600,8 +12430,6 @@ "CLSI 2019" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE "CLSI 2019" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 21" 1 2048 FALSE @@ -10611,7 +12439,7 @@ "CLSI 2019" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 5" 2 8 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2019" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2019" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 21" 4 2048 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2019" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 17" "30ug" 23 6 FALSE "CLSI 2019" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 17" 0.5 2048 FALSE @@ -10620,18 +12448,12 @@ "CLSI 2019" "DISK" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" "30ug" 28 24 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2019" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 21" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2019" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2019" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2019" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2019" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2019" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2019" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 4" 0.5 8 FALSE "CLSI 2019" "DISK" "Campylobacter" 3 "Erythromycin" "M45 Table 5" 16 12 FALSE @@ -10648,6 +12470,7 @@ "CLSI 2019" "MIC" "Paenibacillus mucilaginosus" 2 "Erythromycin" "M45 Table 19" 0.5 8 FALSE "CLSI 2019" "DISK" "Pasteurella" 3 "Erythromycin" "M45 Table 17" "15ug" 27 24 FALSE "CLSI 2019" "MIC" "Pasteurella" 3 "Erythromycin" "M45 Table 17" 0.5 2 FALSE +"CLSI 2019" "MIC" "Rothia mucilaginosa" 2 "Erythromycin" "M45 Table 19" 0.5 8 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Erythromycin" "Table 2C" "15ug" 23 13 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Erythromycin" "Table 2C" 0.5 8 FALSE "CLSI 2019" "DISK" "Streptococcus" 3 "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE @@ -10656,8 +12479,7 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2019" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE "CLSI 2019" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 3" 0.5 2 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE @@ -10665,12 +12487,9 @@ "CLSI 2019" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Cefiderocol" "Table 2B-2" 4 16 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Cefiderocol" "Table 2B-1" 4 16 FALSE "CLSI 2019" "MIC" "Stenotrophomonas maltophilia" 2 "Cefiderocol" "Table 2B-4" 4 16 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefiderocol" "Generic rules" 4 16 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE @@ -10692,16 +12511,11 @@ "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Cefepime" "M45 Table 20" "30ug" 25 18 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Cefepime" "M45 Table 20" 2 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 25 18 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 2 16 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE "CLSI 2019" "DISK" "Candida" 3 "Fluconazole" "Table 1" 50 14 FALSE "CLSI 2019" "MIC" "Candida" 3 "Fluconazole" "Table 1" 0.001 64 FALSE "CLSI 2019" "DISK" "Candida albicans" 2 "Fluconazole" "Table 1" 17 13 FALSE @@ -10719,8 +12533,8 @@ "CLSI 2019" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE "CLSI 2019" "MIC" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" 2 8 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE -"CLSI 2019" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2019" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2019" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2019" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2019" "DISK" "Coagulase-positive Staphylococcus (CoPS)" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2019" "DISK" "Staphylococcus epidermidis" 2 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE @@ -10728,8 +12542,6 @@ "CLSI 2019" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Cefoxitin" "M45 Table 20" "30ug" 18 14 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Cefoxitin" "M45 Table 20" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE @@ -10749,18 +12561,13 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE "CLSI 2019" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE "CLSI 2019" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE @@ -10768,7 +12575,7 @@ "CLSI 2019" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 4" 4 16 FALSE "CLSI 2019" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 21" 4 2048 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2019" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2019" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 21" 4 2048 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2019" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 11" 4 16 FALSE "CLSI 2019" "DISK" "Pseudomonas aeruginosa" 2 "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE @@ -10778,8 +12585,6 @@ "CLSI 2019" "DISK" "Vibrio" 3 "Gentamicin" "M45 Table 20" "10ug" 15 12 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Gentamicin" "M45 Table 20" 4 16 FALSE "CLSI 2019" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 21" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE "CLSI 2019" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE @@ -10792,8 +12597,6 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 2 8 FALSE @@ -10817,10 +12620,7 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Imipenem" "M45 Table 20" "10ug" 23 19 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Imipenem" "M45 Table 20" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2019" "MIC" "Aerococcus" 3 "Linezolid" "M45 Table 2" 2 2048 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE @@ -10833,8 +12633,6 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Lomefloxacin" "Table 2E" 2 2048 FALSE @@ -10842,16 +12640,10 @@ "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE @@ -10866,7 +12658,7 @@ "CLSI 2019" "MIC" "Eikenella corrodens" 2 "Levofloxacin" "M45 Table 9" 2 8 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE -"CLSI 2019" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE "CLSI 2019" "MIC" "Gemella" 3 "Levofloxacin" "M45 Table 8" 2 8 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2019" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE @@ -10881,6 +12673,7 @@ "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Levofloxacin" "Table 2B-1" 1 4 FALSE "CLSI 2019" "DISK" "Pasteurella" 3 "Levofloxacin" "M45 Table 17" "5ug" 28 6 FALSE "CLSI 2019" "MIC" "Pasteurella" 3 "Levofloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2019" "MIC" "Rothia mucilaginosa" 2 "Levofloxacin" "M45 Table 19" 1 4 FALSE "CLSI 2019" "MIC" "Salmonella" 3 "Levofloxacin" "Table 2A" 0.125 2 FALSE "CLSI 2019" "MIC" "Extraintestinal" "Salmonella" 3 "Levofloxacin" "Table 2A" 0.125 2 FALSE "CLSI 2019" "DISK" "Stenotrophomonas maltophilia" 2 "Levofloxacin" "Table 2B-4" "75ug" 17 13 FALSE @@ -10896,15 +12689,8 @@ "CLSI 2019" "DISK" "Vibrio" 3 "Levofloxacin" "M45 Table 20" "5ug" 17 13 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Levofloxacin" "M45 Table 20" 2 8 FALSE "CLSI 2019" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 21 16 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 0.5 2 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 20 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 2 8 FALSE @@ -10935,12 +12721,7 @@ "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Meropenem" "M45 Table 20" "10ug" 23 19 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Meropenem" "M45 Table 20" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Meropenem/vaborbactam" "Generic rules" "20/10ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Meropenem/vaborbactam" "Generic rules" "20/10ug" 4 16 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Moxifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Moxifloxacin" "Table 2E" 1 2048 FALSE "CLSI 2019" "DISK" "Pasteurella" 3 "Moxifloxacin" "M45 Table 17" "5ug" 28 6 FALSE @@ -10949,8 +12730,6 @@ "CLSI 2019" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2019" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2019" "DISK" "Candida" 3 "Micafungin" "Table 1" 30 27 FALSE "CLSI 2019" "MIC" "Candida" 3 "Micafungin" "Table 1" 0.064 0.25 FALSE "CLSI 2019" "DISK" "Candida albicans" 2 "Micafungin" "Table 1" 22 19 FALSE @@ -10979,26 +12758,16 @@ "CLSI 2019" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2019" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2019" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2019" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Ofloxacin" "Table 2E" 2 2048 FALSE @@ -11016,17 +12785,13 @@ "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Ofloxacin" "M45 Table 20" "5ug" 16 12 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Ofloxacin" "M45 Table 20" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Oritavancin" "Table 2D" 0.125 2048 FALSE -"CLSI 2019" "MIC" "Staphylococcus aureus aureus" 1 "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2019" "MIC" "Staphylococcus aureus" 2 "Oritavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oritavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2019" "MIC" "Streptococcus" 3 "Oritavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Table 2H-2" 0.25 2048 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 0.25 0.5 FALSE -"CLSI 2019" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2019" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2019" "DISK" "Staphylococcus epidermidis" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2019" "MIC" "Staphylococcus epidermidis" 2 "Oxacillin" "Table 2C" 0.25 0.5 FALSE @@ -11036,7 +12801,6 @@ "CLSI 2019" "DISK" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2019" "MIC" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" 0.25 0.5 FALSE "CLSI 2019" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2019" "DISK" "Salmonella" 3 "Pefloxacin" "Table 2A" 24 23 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2019" "MIC" "Aerococcus" 3 "Benzylpenicillin" "M45 Table 2" 0.125 4 FALSE @@ -11062,6 +12826,7 @@ "CLSI 2019" "MIC" "Paenibacillus mucilaginosus" 2 "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE "CLSI 2019" "DISK" "Pasteurella" 3 "Benzylpenicillin" "M45 Table 17" "10 Units" 25 6 FALSE "CLSI 2019" "MIC" "Pasteurella" 3 "Benzylpenicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Rothia mucilaginosa" 2 "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Benzylpenicillin" "Table 2C" "10ug" 29 28 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE "CLSI 2019" "DISK" "Streptococcus" 3 "Benzylpenicillin" "Table 2H-1" "10units" 24 6 FALSE @@ -11070,8 +12835,7 @@ "CLSI 2019" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2019" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2019" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE @@ -11080,16 +12844,8 @@ "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Piperacillin" "M45 Table 20" "100ug" 21 17 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Piperacillin" "M45 Table 20" 16 128 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 2 4 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE "CLSI 2019" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -11098,8 +12854,6 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2019" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE "CLSI 2019" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 4" 1 4 FALSE "CLSI 2019" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 9" 1 4 FALSE @@ -11116,8 +12870,6 @@ "CLSI 2019" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2019" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE "CLSI 2019" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE @@ -11129,36 +12881,26 @@ "CLSI 2019" "MIC" "Kingella" 3 "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Ampicillin/sulbactam" "M45 Table 20" "10ug" 15 11 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Ampicillin/sulbactam" "M45 Table 20" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2019" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Sulfamethoxazole" "M45 Table 20" "200ug" 17 12 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2019" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Sulfisoxazole" "M45 Table 20" "200ug" 17 12 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2019" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2019" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2019" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2019" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2019" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2019" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2019" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE "CLSI 2019" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE @@ -11167,13 +12909,10 @@ "CLSI 2019" "MIC" "Vibrio" 3 "Sulfonamide" "M45 Table 20" 256 512 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2019" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 21" 8 2048 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2019" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2019" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 21" 8 2048 FALSE "CLSI 2019" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 21" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE "CLSI 2019" "MIC" "Aerococcus" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE @@ -11200,6 +12939,7 @@ "CLSI 2019" "MIC" "Paenibacillus mucilaginosus" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE "CLSI 2019" "DISK" "Pasteurella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 17" "1.25ug/23.75ug" 24 6 FALSE "CLSI 2019" "MIC" "Pasteurella" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Rothia mucilaginosa" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE "CLSI 2019" "DISK" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-4" "30ug" 16 10 FALSE "CLSI 2019" "MIC" "Stenotrophomonas maltophilia" 2 "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE @@ -11209,8 +12949,6 @@ "CLSI 2019" "DISK" "Vibrio" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 20" "1.25ug" 16 10 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 20" 2 4 FALSE "CLSI 2019" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE "CLSI 2019" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE @@ -11218,8 +12956,6 @@ "CLSI 2019" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2019" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE "CLSI 2019" "MIC" "Aerococcus" 3 "Tetracycline" "M45 Table 2" 2 8 FALSE @@ -11236,7 +12972,7 @@ "CLSI 2019" "MIC" "Eikenella corrodens" 2 "Tetracycline" "M45 Table 9" 2 8 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2019" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2019" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 21" 4 2048 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -11259,46 +12995,28 @@ "CLSI 2019" "DISK" "Vibrio" 3 "Tetracycline" "M45 Table 20" "30ug" 15 11 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Tetracycline" "M45 Table 20" 4 16 FALSE "CLSI 2019" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 21" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2019" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2019" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2019" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2019" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2019" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2019" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2019" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2019" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Telavancin" "Table 2D" 0.125 2048 FALSE -"CLSI 2019" "MIC" "Staphylococcus aureus aureus" 1 "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2019" "MIC" "Staphylococcus aureus" 2 "Telavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Telavancin" "Table 2C" 0.125 2048 FALSE "CLSI 2019" "MIC" "Streptococcus" 3 "Telavancin" "Table 2H-1" 0.125 2048 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Telavancin" "Table 2H-2" 0.125 2048 FALSE "CLSI 2019" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2019" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2019" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE "CLSI 2019" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2019" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2019" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2019" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2019" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -11310,7 +13028,7 @@ "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Trovafloxacin" "Table 2H-2" 1 4 FALSE "CLSI 2019" "MIC" "Enterococcus" 3 "Tedizolid" "Table 2D" 0.5 2048 FALSE -"CLSI 2019" "MIC" "Staphylococcus aureus aureus" 1 "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2019" "MIC" "Staphylococcus aureus" 2 "Tedizolid" "Table 2C" 0.5 2 FALSE "CLSI 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Tedizolid" "Table 2C" 0.5 2 FALSE "CLSI 2019" "MIC" "Streptococcus" 3 "Tedizolid" "Table 2H-1" 0.5 2048 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tedizolid" "Table 2H-2" 0.25 2048 FALSE @@ -11325,8 +13043,6 @@ "CLSI 2019" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE "CLSI 2019" "DISK" "Vibrio" 3 "Piperacillin/tazobactam" "M45 Table 20" "100ug" 21 17 FALSE "CLSI 2019" "MIC" "Vibrio" 3 "Piperacillin/tazobactam" "M45 Table 20" 16 128 FALSE -"CLSI 2019" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2019" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2019" "MIC" "Aerococcus" 3 "Vancomycin" "M45 Table 2" 1 2048 FALSE "CLSI 2019" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 4" 4 2048 FALSE @@ -11339,8 +13055,9 @@ "CLSI 2019" "MIC" "Lactococcus" 3 "Vancomycin" "M45 Table 12" 2 4 FALSE "CLSI 2019" "MIC" "Micrococcus" 3 "Vancomycin" "M45 Table 15" 2 2048 FALSE "CLSI 2019" "MIC" "Paenibacillus mucilaginosus" 2 "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2019" "MIC" "Rothia mucilaginosa" 2 "Vancomycin" "M45 Table 19" 2 2048 FALSE "CLSI 2019" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2019" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2019" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2019" "MIC" "Coagulase-positive Staphylococcus (CoPS)" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2019" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2019" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE @@ -11348,7 +13065,7 @@ "CLSI 2019" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2019" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2019" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2019" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2019" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2019" "DISK" "Candida albicans" 2 "Voriconazole" "Table 1" 17 14 FALSE "CLSI 2019" "MIC" "Candida albicans" 2 "Voriconazole" "Table 1" 0.125 1 FALSE "CLSI 2019" "DISK" "Candida krusei" 2 "Voriconazole" "Table 1" 15 12 FALSE @@ -11374,8 +13091,6 @@ "CLSI 2018" "DISK" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug" 27 6 FALSE "CLSI 2018" "MIC" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE "CLSI 2018" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE @@ -11386,8 +13101,6 @@ "CLSI 2018" "MIC" "Plesiomonas" 3 "Amikacin" "M45 Table 2" 16 64 FALSE "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2018" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE "CLSI 2018" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE "CLSI 2018" "MIC" "Cardiobacterium" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE @@ -11408,8 +13121,7 @@ "CLSI 2018" "DISK" "Streptococcus" 3 "Ampicillin" "Table 2H-1" "10ug" 24 6 FALSE "CLSI 2018" "MIC" "Streptococcus" 3 "Ampicillin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2018" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE "CLSI 2018" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE @@ -11421,10 +13133,6 @@ "CLSI 2018" "MIC" "Plesiomonas" 3 "Aztreonam" "M45 Table 2" 4 16 FALSE "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2018" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2018" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2018" "MIC" "Eikenella" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE @@ -11448,14 +13156,10 @@ "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2018" "MIC" "Vibrio cholerae" 2 "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" "10ug" 29 6 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" 0.5 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE @@ -11476,28 +13180,18 @@ "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" 8 32 FALSE "CLSI 2018" "MIC" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2018" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 12" 8 32 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE "CLSI 2018" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" 8 32 FALSE "CLSI 2018" "MIC" "Aggregatibacter" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE @@ -11507,7 +13201,7 @@ "CLSI 2018" "MIC" "Eikenella" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2018" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2018" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2018" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -11532,14 +13226,9 @@ "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" 4 16 FALSE "CLSI 2018" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 16" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE @@ -11553,7 +13242,7 @@ "CLSI 2018" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE "CLSI 2018" "MIC" "Erysipelothrix rhusiopathiae" 2 "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE -"CLSI 2018" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2018" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2018" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -11575,8 +13264,7 @@ "CLSI 2018" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" 1 4 FALSE "CLSI 2018" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2018" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 3" 0.5 4 FALSE "CLSI 2018" "MIC" "Erysipelothrix rhusiopathiae" 2 "Clindamycin" "M45 Table 6" 0.25 1 FALSE "CLSI 2018" "MIC" "Granulicatella" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE @@ -11590,8 +13278,7 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2018" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2018" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2018" "MIC" "Eikenella" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE @@ -11609,38 +13296,26 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 2 4 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Colistin" "Table 2B-5" 2 8 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 2 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefpodoxime" "Table 2E" 2 2048 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2018" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2018" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2018" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE -"CLSI 2018" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2018" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2018" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 4 FALSE "CLSI 2018" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2018" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2018" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Carbenicillin" "Table 2B-5" 16 64 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" 8 64 FALSE @@ -11671,16 +13346,11 @@ "CLSI 2018" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE @@ -11708,13 +13378,10 @@ "CLSI 2018" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 1 4 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2018" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2018" "DISK" "Oral" "Haemophilus" 3 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE @@ -11728,31 +13395,21 @@ "CLSI 2018" "MIC" "Plesiomonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2018" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 1 4 FALSE "CLSI 2018" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 21 20 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ceftazidime/avibactam" "Generic rules" "30/20ug" 21 20 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftazidime/avibactam" "Generic rules" "30/20ug" 8 16 FALSE "CLSI 2018" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 15 14 TRUE "CLSI 2018" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE "CLSI 2018" "MIC" "Aeromonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE "CLSI 2018" "MIC" "Bacillus" 3 "Cefazolin" "M45 Table 3" 8 16 FALSE "CLSI 2018" "MIC" "Plesiomonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "30/10" 21 16 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" 4 16 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 2 8 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2018" "MIC" "Enterococcus faecalis" 2 "Dalbavancin" "Table 2D" 0.25 2048 FALSE "CLSI 2018" "MIC" "Streptococcus" 3 "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE @@ -11761,9 +13418,6 @@ "CLSI 2018" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2018" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2018" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -11772,8 +13426,6 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Doripenem" "Table 2E" "10ug" 16 6 FALSE @@ -11783,8 +13435,6 @@ "CLSI 2018" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE "CLSI 2018" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 16" 1 2048 FALSE @@ -11794,7 +13444,7 @@ "CLSI 2018" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 3" 2 8 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2018" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2018" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 16" 4 2048 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2018" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 13" "30ug" 23 6 FALSE "CLSI 2018" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 13" 0.5 2048 FALSE @@ -11804,20 +13454,14 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2018" "MIC" "Vibrio cholerae" 2 "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE "CLSI 2018" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 16" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2018" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2018" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2018" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2018" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2018" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" "10ug" 36 31 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" 0.5 2 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2018" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 3" 0.5 8 FALSE "CLSI 2018" "MIC" "Campylobacter" 3 "Erythromycin" "M45 Table 3" 8 32 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Erythromycin" "Table 2D" "15ug" 23 13 FALSE @@ -11837,8 +13481,7 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE "CLSI 2018" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 2" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE @@ -11848,9 +13491,6 @@ "CLSI 2018" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE "CLSI 2018" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE @@ -11873,24 +13513,15 @@ "CLSI 2018" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 1 4 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 25 18 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 2 16 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" 0.25 1 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Fosfomycin" "Table 2D" 64 256 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2018" "MIC" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE @@ -11899,12 +13530,10 @@ "CLSI 2018" "MIC" "Plesiomonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2018" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2018" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2018" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2018" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2018" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2018" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2018" "MIC" "Abiotrophia" 3 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE @@ -11927,18 +13556,13 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE "CLSI 2018" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE @@ -11946,7 +13570,7 @@ "CLSI 2018" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 3" 4 16 FALSE "CLSI 2018" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2018" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2018" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2018" "MIC" "Leuconostoc" 3 "Gentamicin" "M45 Table 10" 4 16 FALSE "CLSI 2018" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 9" 4 16 FALSE @@ -11958,8 +13582,6 @@ "CLSI 2018" "DISK" "Staphylococcus" 3 "Gentamicin" "Table 2C" "10ug" 15 12 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Gentamicin" "Table 2C" 4 16 FALSE "CLSI 2018" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 16" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE @@ -11972,8 +13594,6 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2018" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 2 8 FALSE @@ -11998,10 +13618,7 @@ "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" 2 8 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE "CLSI 2018" "MIC" "Lactobacillus" 3 "Linezolid" "M45 Table 9" 4 2048 FALSE @@ -12013,8 +13630,6 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Lomefloxacin" "Table 2E" 2 2048 FALSE @@ -12024,16 +13639,10 @@ "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2018" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE @@ -12048,7 +13657,7 @@ "CLSI 2018" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE "CLSI 2018" "MIC" "Erysipelothrix rhusiopathiae" 2 "Levofloxacin" "M45 Table 6" 2 2048 FALSE -"CLSI 2018" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2018" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2018" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE @@ -12075,15 +13684,8 @@ "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2018" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 20 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2018" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 2 8 FALSE @@ -12109,10 +13711,7 @@ "CLSI 2018" "MIC" "Streptococcus" 3 "Meropenem" "Table 2H-1" 0.5 2048 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" "Table 2G" 0.25 1 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Moxifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Moxifloxacin" "Table 2E" 1 2048 FALSE "CLSI 2018" "DISK" "Pasteurella" 3 "Moxifloxacin" "M45 Table 13" "5ug" 28 6 FALSE @@ -12121,8 +13720,6 @@ "CLSI 2018" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2018" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Minocycline" "Table 2B-2" 4 16 FALSE "CLSI 2018" "DISK" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE @@ -12137,26 +13734,16 @@ "CLSI 2018" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2018" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2018" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Norfloxacin" "Table 2D" 4 16 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Norfloxacin" "Table 2B-5" 4 16 FALSE @@ -12164,8 +13751,6 @@ "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" 4 16 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Norfloxacin" "Table 2C" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Ofloxacin" "Table 2E" 2 2048 FALSE @@ -12183,24 +13768,19 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" 2 8 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Oritavancin" "Table 2D" 0.125 2048 FALSE "CLSI 2018" "MIC" "Streptococcus" 3 "Oritavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Table 2H-2" 0.25 2048 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 2 4 FALSE -"CLSI 2018" "DISK" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE -"CLSI 2018" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2018" "DISK" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2018" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2018" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2018" "DISK" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2018" "MIC" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Table 2C" 0.25 0.5 FALSE "CLSI 2018" "DISK" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" 18 17 FALSE "CLSI 2018" "MIC" "Staphylococcus schleiferi" 2 "Oxacillin" "Table 2C" "1ug" 0.25 0.5 FALSE "CLSI 2018" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2018" "DISK" "Salmonella" 3 "Pefloxacin" "Table 2A" 24 23 FALSE "CLSI 2018" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2018" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" "M45 Table 7" 1 4 FALSE @@ -12230,24 +13810,15 @@ "CLSI 2018" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2018" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2018" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin" "Table 2B-5" 16 128 FALSE "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 2 4 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE "CLSI 2018" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -12256,8 +13827,6 @@ "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2018" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE "CLSI 2018" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 3" 1 4 FALSE "CLSI 2018" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE @@ -12274,8 +13843,6 @@ "CLSI 2018" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2018" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE @@ -12287,47 +13854,34 @@ "CLSI 2018" "MIC" "Haemophilus" 3 "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE "CLSI 2018" "DISK" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE "CLSI 2018" "MIC" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2018" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2018" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2018" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2018" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2018" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2018" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2018" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2018" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE "CLSI 2018" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Sulfonamide" "Table 2C" 256 512 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2018" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2018" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2018" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2018" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 16" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE @@ -12360,8 +13914,6 @@ "CLSI 2018" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE "CLSI 2018" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE "CLSI 2018" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE @@ -12369,8 +13921,6 @@ "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2018" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE "CLSI 2018" "DISK" "Aeromonas" 3 "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE @@ -12386,7 +13936,7 @@ "CLSI 2018" "MIC" "Eikenella" 3 "Tetracycline" "M45 Table 7" 2 8 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2018" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2018" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 16" 4 2048 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -12408,46 +13958,28 @@ "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" 2 8 FALSE "CLSI 2018" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 16" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2018" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2018" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2018" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2018" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2018" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2018" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2018" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Telithromycin" "Table 2E" "15ug" 15 11 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Telithromycin" "Table 2E" 4 16 FALSE "CLSI 2018" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2018" "MIC" "Enterococcus" 3 "Telavancin" "Table 2D" 0.125 2048 FALSE "CLSI 2018" "MIC" "Streptococcus" 3 "Telavancin" "Table 2H-1" 0.125 2048 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Telavancin" "Table 2H-2" 0.125 2048 FALSE "CLSI 2018" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2018" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2018" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE "CLSI 2018" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2018" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2018" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2018" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -12472,8 +14004,6 @@ "CLSI 2018" "MIC" "Plesiomonas" 3 "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE "CLSI 2018" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2018" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE -"CLSI 2018" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2018" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2018" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 3" 4 2048 FALSE "CLSI 2018" "MIC" "Cutibacterium acnes" 2 "Vancomycin" "Table 2J-2" 2 4 FALSE @@ -12482,14 +14012,14 @@ "CLSI 2018" "MIC" "Granulicatella" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2018" "MIC" "Lactobacillus" 3 "Vancomycin" "M45 Table 9" 2 16 FALSE "CLSI 2018" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2018" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2018" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2018" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2018" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE "CLSI 2018" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" "30ug" 17 6 FALSE "CLSI 2018" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2018" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2018" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2018" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2018" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug" 18 13 FALSE "CLSI 2017" "MIC" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE "CLSI 2017" "MIC" "Aggregatibacter" 3 "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE @@ -12505,8 +14035,6 @@ "CLSI 2017" "DISK" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug" 27 6 FALSE "CLSI 2017" "MIC" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE "CLSI 2017" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE @@ -12517,8 +14045,6 @@ "CLSI 2017" "MIC" "Plesiomonas" 3 "Amikacin" "M45 Table 2" 16 64 FALSE "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2017" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE "CLSI 2017" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE "CLSI 2017" "MIC" "Cardiobacterium" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE @@ -12539,8 +14065,7 @@ "CLSI 2017" "DISK" "Streptococcus" 3 "Ampicillin" "Table 2H-1" "10ug" 24 6 FALSE "CLSI 2017" "MIC" "Streptococcus" 3 "Ampicillin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2017" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE "CLSI 2017" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE @@ -12552,10 +14077,6 @@ "CLSI 2017" "MIC" "Plesiomonas" 3 "Aztreonam" "M45 Table 2" 4 16 FALSE "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2017" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2017" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2017" "MIC" "Eikenella" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE @@ -12579,14 +14100,10 @@ "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2017" "MIC" "Vibrio cholerae" 2 "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" "10ug" 29 6 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" 0.5 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE @@ -12607,28 +14124,18 @@ "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" 8 32 FALSE "CLSI 2017" "MIC" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2017" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 12" 8 32 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE "CLSI 2017" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" 8 32 FALSE "CLSI 2017" "MIC" "Aggregatibacter" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE @@ -12638,7 +14145,7 @@ "CLSI 2017" "MIC" "Eikenella" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2017" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2017" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2017" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -12663,14 +14170,9 @@ "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" 4 16 FALSE "CLSI 2017" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 16" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE @@ -12684,7 +14186,7 @@ "CLSI 2017" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE "CLSI 2017" "MIC" "Erysipelothrix rhusiopathiae" 2 "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE -"CLSI 2017" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2017" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2017" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -12706,8 +14208,7 @@ "CLSI 2017" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" 1 4 FALSE "CLSI 2017" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2017" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 3" 0.5 4 FALSE "CLSI 2017" "MIC" "Erysipelothrix rhusiopathiae" 2 "Clindamycin" "M45 Table 6" 0.25 1 FALSE "CLSI 2017" "MIC" "Granulicatella" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE @@ -12721,8 +14222,7 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2017" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2017" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2017" "MIC" "Eikenella" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE @@ -12740,38 +14240,26 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 2 4 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Colistin" "Table 2B-5" 2 8 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 2 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefpodoxime" "Table 2E" 2 2048 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2017" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2017" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2017" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE -"CLSI 2017" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2017" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2017" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 4 FALSE "CLSI 2017" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2017" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2017" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Carbenicillin" "Table 2B-5" 16 64 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" 8 64 FALSE @@ -12802,16 +14290,11 @@ "CLSI 2017" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE @@ -12839,13 +14322,10 @@ "CLSI 2017" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 1 4 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2017" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2017" "DISK" "Oral" "Haemophilus" 3 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE @@ -12859,34 +14339,24 @@ "CLSI 2017" "MIC" "Plesiomonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2017" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 1 4 FALSE "CLSI 2017" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2017" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 15 14 TRUE "CLSI 2017" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE "CLSI 2017" "MIC" "Aeromonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE "CLSI 2017" "MIC" "Bacillus" 3 "Cefazolin" "M45 Table 3" 8 16 FALSE "CLSI 2017" "MIC" "Plesiomonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "30/10" 21 16 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" 4 16 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 2 8 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Daptomycin" "Table 2D" 4 2048 FALSE "CLSI 2017" "MIC" "Lactobacillus" 3 "Daptomycin" "M45 Table 9" 4 2048 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2017" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2017" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -12895,8 +14365,6 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Doripenem" "Table 2E" "10ug" 16 6 FALSE @@ -12906,8 +14374,6 @@ "CLSI 2017" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE "CLSI 2017" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 16" 1 2048 FALSE @@ -12917,7 +14383,7 @@ "CLSI 2017" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 3" 2 8 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2017" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2017" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 16" 4 2048 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2017" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 13" "30ug" 23 6 FALSE "CLSI 2017" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 13" 0.5 2048 FALSE @@ -12927,20 +14393,14 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2017" "MIC" "Vibrio cholerae" 2 "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE "CLSI 2017" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 16" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2017" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2017" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2017" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2017" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2017" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" "10ug" 36 31 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" 0.5 2 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2017" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 3" 0.5 8 FALSE "CLSI 2017" "MIC" "Campylobacter" 3 "Erythromycin" "M45 Table 3" 8 32 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Erythromycin" "Table 2D" "15ug" 23 13 FALSE @@ -12960,8 +14420,7 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE "CLSI 2017" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 2" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE @@ -12971,9 +14430,6 @@ "CLSI 2017" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE "CLSI 2017" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE @@ -12996,24 +14452,15 @@ "CLSI 2017" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 1 4 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 25 18 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 2 16 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" 0.25 1 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Fosfomycin" "Table 2D" 64 256 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2017" "MIC" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE @@ -13022,12 +14469,10 @@ "CLSI 2017" "MIC" "Plesiomonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2017" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2017" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2017" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2017" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2017" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2017" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2017" "MIC" "Abiotrophia" 3 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE @@ -13050,18 +14495,13 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE "CLSI 2017" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE @@ -13069,7 +14509,7 @@ "CLSI 2017" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 3" 4 16 FALSE "CLSI 2017" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2017" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2017" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2017" "MIC" "Leuconostoc" 3 "Gentamicin" "M45 Table 10" 4 16 FALSE "CLSI 2017" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 9" 4 16 FALSE @@ -13081,8 +14521,6 @@ "CLSI 2017" "DISK" "Staphylococcus" 3 "Gentamicin" "Table 2C" "10ug" 15 12 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Gentamicin" "Table 2C" 4 16 FALSE "CLSI 2017" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 16" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE @@ -13095,8 +14533,6 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2017" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 2 8 FALSE @@ -13121,10 +14557,7 @@ "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" 2 8 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE "CLSI 2017" "MIC" "Lactobacillus" 3 "Linezolid" "M45 Table 9" 4 2048 FALSE @@ -13136,8 +14569,6 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Lomefloxacin" "Table 2E" 2 2048 FALSE @@ -13147,16 +14578,10 @@ "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2017" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE @@ -13171,7 +14596,7 @@ "CLSI 2017" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE "CLSI 2017" "MIC" "Erysipelothrix rhusiopathiae" 2 "Levofloxacin" "M45 Table 6" 2 2048 FALSE -"CLSI 2017" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2017" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2017" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE @@ -13198,15 +14623,8 @@ "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2017" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 20 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2017" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 2 8 FALSE @@ -13232,10 +14650,7 @@ "CLSI 2017" "MIC" "Streptococcus" 3 "Meropenem" "Table 2H-1" 0.5 2048 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" "Table 2G" 0.25 1 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Moxifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Moxifloxacin" "Table 2E" 1 2048 FALSE "CLSI 2017" "DISK" "Pasteurella" 3 "Moxifloxacin" "M45 Table 13" "5ug" 28 6 FALSE @@ -13244,8 +14659,6 @@ "CLSI 2017" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2017" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Minocycline" "Table 2B-2" 4 16 FALSE "CLSI 2017" "DISK" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE @@ -13260,26 +14673,16 @@ "CLSI 2017" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2017" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2017" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Norfloxacin" "Table 2D" 4 16 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Norfloxacin" "Table 2B-5" 4 16 FALSE @@ -13287,8 +14690,6 @@ "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" 4 16 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Norfloxacin" "Table 2C" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Ofloxacin" "Table 2E" 2 2048 FALSE @@ -13306,22 +14707,17 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" 2 8 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Oritavancin" "Table 2D" 0.125 2048 FALSE "CLSI 2017" "MIC" "Streptococcus" 3 "Oritavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Table 2H-2" 0.25 2048 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 2 4 FALSE -"CLSI 2017" "DISK" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE -"CLSI 2017" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2017" "DISK" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2017" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2017" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2017" "DISK" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2017" "MIC" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Table 2C" 0.25 0.5 FALSE "CLSI 2017" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2017" "DISK" "Salmonella" 3 "Pefloxacin" "Table 2A" 24 23 FALSE "CLSI 2017" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2017" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" "M45 Table 7" 1 4 FALSE @@ -13351,24 +14747,15 @@ "CLSI 2017" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2017" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2017" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin" "Table 2B-5" 16 128 FALSE "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 2 4 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE "CLSI 2017" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -13377,8 +14764,6 @@ "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2017" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE "CLSI 2017" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 3" 1 4 FALSE "CLSI 2017" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE @@ -13395,8 +14780,6 @@ "CLSI 2017" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2017" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE @@ -13408,47 +14791,34 @@ "CLSI 2017" "MIC" "Haemophilus" 3 "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE "CLSI 2017" "DISK" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE "CLSI 2017" "MIC" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2017" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2017" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2017" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2017" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2017" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2017" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2017" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2017" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE "CLSI 2017" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Sulfonamide" "Table 2C" 256 512 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2017" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2017" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2017" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2017" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 16" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE @@ -13481,8 +14851,6 @@ "CLSI 2017" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE "CLSI 2017" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE "CLSI 2017" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE @@ -13490,8 +14858,6 @@ "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2017" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE "CLSI 2017" "DISK" "Aeromonas" 3 "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE @@ -13507,7 +14873,7 @@ "CLSI 2017" "MIC" "Eikenella" 3 "Tetracycline" "M45 Table 7" 2 8 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2017" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2017" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 16" 4 2048 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -13529,46 +14895,28 @@ "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" 2 8 FALSE "CLSI 2017" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 16" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2017" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2017" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2017" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2017" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2017" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2017" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2017" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Telithromycin" "Table 2E" "15ug" 15 11 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Telithromycin" "Table 2E" 4 16 FALSE "CLSI 2017" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2017" "MIC" "Enterococcus" 3 "Telavancin" "Table 2D" 0.125 2048 FALSE "CLSI 2017" "MIC" "Streptococcus" 3 "Telavancin" "Table 2H-1" 0.125 2048 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Telavancin" "Table 2H-2" 0.125 2048 FALSE "CLSI 2017" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2017" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2017" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE "CLSI 2017" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2017" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2017" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2017" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -13593,8 +14941,6 @@ "CLSI 2017" "MIC" "Plesiomonas" 3 "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE "CLSI 2017" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2017" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE -"CLSI 2017" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2017" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2017" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 3" 4 2048 FALSE "CLSI 2017" "MIC" "Cutibacterium acnes" 2 "Vancomycin" "Table 2J-2" 2 4 FALSE @@ -13603,14 +14949,14 @@ "CLSI 2017" "MIC" "Granulicatella" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2017" "MIC" "Lactobacillus" 3 "Vancomycin" "M45 Table 9" 2 16 FALSE "CLSI 2017" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2017" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2017" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2017" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2017" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE "CLSI 2017" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" "30ug" 17 6 FALSE "CLSI 2017" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2017" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2017" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2017" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2017" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug" 18 13 FALSE "CLSI 2016" "MIC" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE "CLSI 2016" "MIC" "Aggregatibacter" 3 "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE @@ -13626,8 +14972,6 @@ "CLSI 2016" "DISK" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug" 27 6 FALSE "CLSI 2016" "MIC" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE "CLSI 2016" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE @@ -13638,8 +14982,6 @@ "CLSI 2016" "MIC" "Plesiomonas" 3 "Amikacin" "M45 Table 2" 16 64 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2016" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE "CLSI 2016" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE "CLSI 2016" "MIC" "Cardiobacterium" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE @@ -13660,8 +15002,7 @@ "CLSI 2016" "DISK" "Streptococcus" 3 "Ampicillin" "Table 2H-1" "10ug" 24 6 FALSE "CLSI 2016" "MIC" "Streptococcus" 3 "Ampicillin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2016" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE "CLSI 2016" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE @@ -13673,10 +15014,6 @@ "CLSI 2016" "MIC" "Plesiomonas" 3 "Aztreonam" "M45 Table 2" 4 16 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2016" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2016" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2016" "MIC" "Eikenella" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE @@ -13700,14 +15037,10 @@ "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2016" "MIC" "Vibrio cholerae" 2 "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" "10ug" 29 6 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" 0.5 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE @@ -13728,28 +15061,18 @@ "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" 8 32 FALSE "CLSI 2016" "MIC" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2016" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 12" 8 32 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE "CLSI 2016" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" 8 32 FALSE "CLSI 2016" "MIC" "Aggregatibacter" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE @@ -13759,7 +15082,7 @@ "CLSI 2016" "MIC" "Eikenella" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2016" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2016" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2016" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -13784,14 +15107,9 @@ "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" 4 16 FALSE "CLSI 2016" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 16" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE @@ -13805,7 +15123,7 @@ "CLSI 2016" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE "CLSI 2016" "MIC" "Erysipelothrix rhusiopathiae" 2 "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE -"CLSI 2016" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2016" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2016" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -13827,8 +15145,7 @@ "CLSI 2016" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" 1 4 FALSE "CLSI 2016" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2016" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 3" 0.5 4 FALSE "CLSI 2016" "MIC" "Erysipelothrix rhusiopathiae" 2 "Clindamycin" "M45 Table 6" 0.25 1 FALSE "CLSI 2016" "MIC" "Granulicatella" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE @@ -13842,8 +15159,7 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2016" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2016" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2016" "MIC" "Eikenella" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE @@ -13861,39 +15177,27 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 2 4 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Colistin" "Table 2B-5" 2 8 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" "10ug" 11 10 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefpodoxime" "Table 2E" 2 2048 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2016" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2016" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2016" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE -"CLSI 2016" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2016" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2016" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 4 FALSE "CLSI 2016" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2016" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2016" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Carbenicillin" "Table 2B-5" 16 64 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" 8 64 FALSE @@ -13924,16 +15228,11 @@ "CLSI 2016" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE @@ -13961,13 +15260,10 @@ "CLSI 2016" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 1 4 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2016" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2016" "DISK" "Oral" "Haemophilus" 3 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE @@ -13981,34 +15277,24 @@ "CLSI 2016" "MIC" "Plesiomonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2016" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 1 4 FALSE "CLSI 2016" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2016" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 15 14 TRUE "CLSI 2016" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE "CLSI 2016" "MIC" "Aeromonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE "CLSI 2016" "MIC" "Bacillus" 3 "Cefazolin" "M45 Table 3" 8 16 FALSE "CLSI 2016" "MIC" "Plesiomonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" "30/10" 21 16 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Ceftolozane/tazobactam" 4 16 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ceftolozane/tazobactam" "Generic rules" "30/10ug" 2 8 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Daptomycin" "Table 2D" 4 2048 FALSE "CLSI 2016" "MIC" "Lactobacillus" 3 "Daptomycin" "M45 Table 9" 4 2048 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2016" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2016" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -14017,8 +15303,6 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Doripenem" "Table 2E" "10ug" 16 6 FALSE @@ -14028,8 +15312,6 @@ "CLSI 2016" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE "CLSI 2016" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 16" 1 2048 FALSE @@ -14039,7 +15321,7 @@ "CLSI 2016" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 3" 2 8 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2016" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2016" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 16" 4 2048 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2016" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 13" "30ug" 23 6 FALSE "CLSI 2016" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 13" 0.5 2048 FALSE @@ -14049,20 +15331,14 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2016" "MIC" "Vibrio cholerae" 2 "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE "CLSI 2016" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 16" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2016" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2016" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2016" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2016" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2016" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" "10ug" 36 31 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" 0.5 2 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2016" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 3" 0.5 8 FALSE "CLSI 2016" "MIC" "Campylobacter" 3 "Erythromycin" "M45 Table 3" 8 32 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Erythromycin" "Table 2D" "15ug" 23 13 FALSE @@ -14082,8 +15358,7 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE "CLSI 2016" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 2" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE @@ -14093,9 +15368,6 @@ "CLSI 2016" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE "CLSI 2016" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE @@ -14118,24 +15390,15 @@ "CLSI 2016" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 1 4 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 25 18 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 2 16 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" 0.25 1 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Fosfomycin" "Table 2D" 64 256 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2016" "MIC" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE @@ -14144,12 +15407,10 @@ "CLSI 2016" "MIC" "Plesiomonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2016" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2016" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2016" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2016" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2016" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2016" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2016" "MIC" "Abiotrophia" 3 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE @@ -14172,18 +15433,13 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE "CLSI 2016" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE @@ -14191,7 +15447,7 @@ "CLSI 2016" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 3" 4 16 FALSE "CLSI 2016" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2016" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2016" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2016" "MIC" "Leuconostoc" 3 "Gentamicin" "M45 Table 10" 4 16 FALSE "CLSI 2016" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 9" 4 16 FALSE @@ -14203,8 +15459,6 @@ "CLSI 2016" "DISK" "Staphylococcus" 3 "Gentamicin" "Table 2C" "10ug" 15 12 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Gentamicin" "Table 2C" 4 16 FALSE "CLSI 2016" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 16" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE @@ -14217,8 +15471,6 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2016" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 2 8 FALSE @@ -14243,10 +15495,7 @@ "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" 2 8 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE "CLSI 2016" "MIC" "Lactobacillus" 3 "Linezolid" "M45 Table 9" 4 2048 FALSE @@ -14258,8 +15507,6 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Lomefloxacin" "Table 2E" 2 2048 FALSE @@ -14269,16 +15516,10 @@ "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2016" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE @@ -14293,7 +15534,7 @@ "CLSI 2016" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE "CLSI 2016" "MIC" "Erysipelothrix rhusiopathiae" 2 "Levofloxacin" "M45 Table 6" 2 2048 FALSE -"CLSI 2016" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2016" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2016" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE @@ -14320,15 +15561,8 @@ "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2016" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 20 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2016" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 2 8 FALSE @@ -14354,10 +15588,7 @@ "CLSI 2016" "MIC" "Streptococcus" 3 "Meropenem" "Table 2H-1" 0.5 2048 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" "Table 2G" 0.25 1 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Moxifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Moxifloxacin" "Table 2E" 1 2048 FALSE "CLSI 2016" "DISK" "Pasteurella" 3 "Moxifloxacin" "M45 Table 13" "5ug" 28 6 FALSE @@ -14366,8 +15597,6 @@ "CLSI 2016" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2016" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Minocycline" "Table 2B-2" 4 16 FALSE "CLSI 2016" "DISK" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE @@ -14382,26 +15611,16 @@ "CLSI 2016" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2016" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2016" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Norfloxacin" "Table 2D" 4 16 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Norfloxacin" "Table 2B-5" 4 16 FALSE @@ -14409,8 +15628,6 @@ "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" 4 16 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Norfloxacin" "Table 2C" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Ofloxacin" "Table 2E" 2 2048 FALSE @@ -14428,22 +15645,17 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" 2 8 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Oritavancin" "Table 2D" 0.125 2048 FALSE "CLSI 2016" "MIC" "Streptococcus" 3 "Oritavancin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Oritavancin" "Table 2H-2" 0.25 2048 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 2 4 FALSE -"CLSI 2016" "DISK" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE -"CLSI 2016" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2016" "DISK" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2016" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2016" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2016" "DISK" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Table 2C" "1ug" 18 17 FALSE "CLSI 2016" "MIC" "Staphylococcus pseudintermedius" 2 "Oxacillin" "Table 2C" 0.25 0.5 FALSE "CLSI 2016" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2016" "DISK" "Salmonella" 3 "Pefloxacin" "Table 2A" 24 23 FALSE "CLSI 2016" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2016" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" "M45 Table 7" 1 4 FALSE @@ -14473,26 +15685,17 @@ "CLSI 2016" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2016" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2016" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin" "Table 2B-5" 16 128 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 2 4 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Polymyxin B" "Table 2B-5" 2 8 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE "CLSI 2016" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -14501,8 +15704,6 @@ "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2016" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE "CLSI 2016" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 3" 1 4 FALSE "CLSI 2016" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE @@ -14519,8 +15720,6 @@ "CLSI 2016" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2016" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE @@ -14532,47 +15731,34 @@ "CLSI 2016" "MIC" "Haemophilus" 3 "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE "CLSI 2016" "DISK" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE "CLSI 2016" "MIC" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2016" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2016" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2016" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2016" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2016" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2016" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2016" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2016" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE "CLSI 2016" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Sulfonamide" "Table 2C" 256 512 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2016" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2016" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2016" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2016" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 16" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE @@ -14605,8 +15791,6 @@ "CLSI 2016" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE "CLSI 2016" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE "CLSI 2016" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE @@ -14614,8 +15798,6 @@ "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2016" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE "CLSI 2016" "DISK" "Aeromonas" 3 "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE @@ -14631,7 +15813,7 @@ "CLSI 2016" "MIC" "Eikenella" 3 "Tetracycline" "M45 Table 7" 2 8 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2016" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2016" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 16" 4 2048 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -14653,30 +15835,18 @@ "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" 2 8 FALSE "CLSI 2016" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 16" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2016" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2016" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2016" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2016" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2016" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2016" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Telithromycin" "Table 2E" "15ug" 15 11 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Telithromycin" "Table 2E" 4 16 FALSE "CLSI 2016" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2016" "DISK" "Enterococcus" 3 "Telavancin" "Table 2D" "30ug" 15 6 FALSE "CLSI 2016" "MIC" "Enterococcus" 3 "Telavancin" "Table 2D" 0.125 2048 FALSE "CLSI 2016" "DISK" "Streptococcus" 3 "Telavancin" "Table 2H-1" "30ug" 15 6 FALSE @@ -14685,17 +15855,11 @@ "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Telavancin" "Table 2H-2" 0.125 2048 FALSE "CLSI 2016" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2016" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2016" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE "CLSI 2016" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2016" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2016" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2016" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -14720,8 +15884,6 @@ "CLSI 2016" "MIC" "Plesiomonas" 3 "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE "CLSI 2016" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2016" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE -"CLSI 2016" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2016" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2016" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 3" 4 2048 FALSE "CLSI 2016" "MIC" "Cutibacterium acnes" 2 "Vancomycin" "Table 2J-2" 2 4 FALSE @@ -14730,14 +15892,14 @@ "CLSI 2016" "MIC" "Granulicatella" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2016" "MIC" "Lactobacillus" 3 "Vancomycin" "M45 Table 9" 2 16 FALSE "CLSI 2016" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2016" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2016" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2016" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2016" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE "CLSI 2016" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" "30ug" 17 6 FALSE "CLSI 2016" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2016" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2016" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2016" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2016" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug" 18 13 FALSE "CLSI 2015" "MIC" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE "CLSI 2015" "MIC" "Aggregatibacter" 3 "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE @@ -14753,8 +15915,6 @@ "CLSI 2015" "DISK" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug" 27 6 FALSE "CLSI 2015" "MIC" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE "CLSI 2015" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE @@ -14765,8 +15925,6 @@ "CLSI 2015" "MIC" "Plesiomonas" 3 "Amikacin" "M45 Table 2" 16 64 FALSE "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2015" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE "CLSI 2015" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE "CLSI 2015" "MIC" "Cardiobacterium" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE @@ -14787,8 +15945,7 @@ "CLSI 2015" "DISK" "Streptococcus" 3 "Ampicillin" "Table 2H-1" "10ug" 24 6 FALSE "CLSI 2015" "MIC" "Streptococcus" 3 "Ampicillin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2015" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE "CLSI 2015" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE @@ -14800,10 +15957,6 @@ "CLSI 2015" "MIC" "Plesiomonas" 3 "Aztreonam" "M45 Table 2" 4 16 FALSE "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2015" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2015" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2015" "MIC" "Eikenella" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE @@ -14827,14 +15980,10 @@ "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2015" "MIC" "Vibrio cholerae" 2 "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" "10ug" 29 6 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" 0.5 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE @@ -14855,30 +16004,18 @@ "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" 8 32 FALSE "CLSI 2015" "MIC" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2015" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 12" 8 32 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE "CLSI 2015" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" 8 32 FALSE "CLSI 2015" "MIC" "Aggregatibacter" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE @@ -14888,7 +16025,7 @@ "CLSI 2015" "MIC" "Eikenella" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2015" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2015" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2015" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -14913,14 +16050,9 @@ "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" 4 16 FALSE "CLSI 2015" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 16" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE @@ -14934,7 +16066,7 @@ "CLSI 2015" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE "CLSI 2015" "MIC" "Erysipelothrix rhusiopathiae" 2 "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE -"CLSI 2015" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2015" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2015" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -14956,8 +16088,7 @@ "CLSI 2015" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" 1 4 FALSE "CLSI 2015" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2015" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 3" 0.5 4 FALSE "CLSI 2015" "MIC" "Erysipelothrix rhusiopathiae" 2 "Clindamycin" "M45 Table 6" 0.25 1 FALSE "CLSI 2015" "MIC" "Granulicatella" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE @@ -14971,8 +16102,7 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2015" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2015" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2015" "MIC" "Eikenella" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE @@ -14990,39 +16120,27 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 2 4 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Colistin" "Table 2B-5" 2 8 FALSE "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" "10ug" 11 10 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefpodoxime" "Table 2E" 2 2048 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2015" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2015" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2015" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE -"CLSI 2015" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2015" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2015" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 4 FALSE "CLSI 2015" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2015" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2015" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Carbenicillin" "Table 2B-5" 16 64 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" 8 64 FALSE @@ -15053,16 +16171,11 @@ "CLSI 2015" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE @@ -15090,13 +16203,10 @@ "CLSI 2015" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 1 4 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2015" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2015" "DISK" "Oral" "Haemophilus" 3 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE @@ -15110,30 +16220,21 @@ "CLSI 2015" "MIC" "Plesiomonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2015" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 1 4 FALSE "CLSI 2015" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2015" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 15 14 TRUE "CLSI 2015" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE "CLSI 2015" "MIC" "Aeromonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE "CLSI 2015" "MIC" "Bacillus" 3 "Cefazolin" "M45 Table 3" 8 16 FALSE "CLSI 2015" "MIC" "Plesiomonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Daptomycin" "Table 2D" 4 2048 FALSE "CLSI 2015" "MIC" "Lactobacillus" 3 "Daptomycin" "M45 Table 9" 4 2048 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2015" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2015" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -15142,8 +16243,6 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Doripenem" "Table 2E" "10ug" 16 6 FALSE @@ -15153,8 +16252,6 @@ "CLSI 2015" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE "CLSI 2015" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 16" 1 2048 FALSE @@ -15164,7 +16261,7 @@ "CLSI 2015" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 3" 2 8 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2015" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2015" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 16" 4 2048 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2015" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 13" "30ug" 23 6 FALSE "CLSI 2015" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 13" 0.5 2048 FALSE @@ -15174,20 +16271,14 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2015" "MIC" "Vibrio cholerae" 2 "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE "CLSI 2015" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 16" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2015" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2015" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2015" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2015" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2015" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" "10ug" 36 31 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" 0.5 2 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2015" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 3" 0.5 8 FALSE "CLSI 2015" "MIC" "Campylobacter" 3 "Erythromycin" "M45 Table 3" 8 32 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Erythromycin" "Table 2D" "15ug" 23 13 FALSE @@ -15207,8 +16298,7 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE "CLSI 2015" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 2" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE @@ -15218,9 +16308,6 @@ "CLSI 2015" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE "CLSI 2015" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE @@ -15243,24 +16330,15 @@ "CLSI 2015" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 1 4 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 25 18 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 2 16 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" 0.25 1 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Fosfomycin" "Table 2D" 64 256 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2015" "MIC" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE @@ -15269,12 +16347,10 @@ "CLSI 2015" "MIC" "Plesiomonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2015" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2015" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2015" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2015" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2015" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2015" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2015" "MIC" "Abiotrophia" 3 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE @@ -15297,18 +16373,13 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE "CLSI 2015" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE @@ -15316,7 +16387,7 @@ "CLSI 2015" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 3" 4 16 FALSE "CLSI 2015" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2015" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2015" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2015" "MIC" "Leuconostoc" 3 "Gentamicin" "M45 Table 10" 4 16 FALSE "CLSI 2015" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 9" 4 16 FALSE @@ -15328,8 +16399,6 @@ "CLSI 2015" "DISK" "Staphylococcus" 3 "Gentamicin" "Table 2C" "10ug" 15 12 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Gentamicin" "Table 2C" 4 16 FALSE "CLSI 2015" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 16" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE @@ -15342,8 +16411,6 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2015" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 2 8 FALSE @@ -15368,10 +16435,7 @@ "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" 2 8 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE "CLSI 2015" "MIC" "Lactobacillus" 3 "Linezolid" "M45 Table 9" 4 2048 FALSE @@ -15383,8 +16447,6 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Lomefloxacin" "Table 2E" 2 2048 FALSE @@ -15394,16 +16456,10 @@ "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2015" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE @@ -15418,7 +16474,7 @@ "CLSI 2015" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE "CLSI 2015" "MIC" "Erysipelothrix rhusiopathiae" 2 "Levofloxacin" "M45 Table 6" 2 2048 FALSE -"CLSI 2015" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2015" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2015" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE @@ -15445,15 +16501,8 @@ "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2015" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 20 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Marbofloxacin" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2015" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 2 8 FALSE @@ -15479,10 +16528,7 @@ "CLSI 2015" "MIC" "Streptococcus" 3 "Meropenem" "Table 2H-1" 0.5 2048 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" "Table 2G" 0.25 1 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Mezlocillin" "Table 2B-2" "75ug" 21 17 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Mezlocillin" "Table 2B-2" 16 128 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Mezlocillin" "Table 2B-5" 16 128 FALSE @@ -15494,8 +16540,6 @@ "CLSI 2015" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2015" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Minocycline" "Table 2B-2" 4 16 FALSE "CLSI 2015" "DISK" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE @@ -15510,26 +16554,16 @@ "CLSI 2015" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2015" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2015" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Norfloxacin" "Table 2D" 4 16 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Norfloxacin" "Table 2B-5" 4 16 FALSE @@ -15537,8 +16571,6 @@ "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" 4 16 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Norfloxacin" "Table 2C" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Ofloxacin" "Table 2E" 2 2048 FALSE @@ -15556,17 +16588,12 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" 2 8 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 2 4 FALSE -"CLSI 2015" "DISK" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE -"CLSI 2015" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2015" "DISK" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2015" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2015" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2015" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2015" "DISK" "Salmonella" 3 "Pefloxacin" "Table 2A" 24 23 FALSE "CLSI 2015" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2015" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" "M45 Table 7" 1 4 FALSE @@ -15596,26 +16623,17 @@ "CLSI 2015" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2015" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2015" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin" "Table 2B-5" 16 128 FALSE "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 2 4 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Polymyxin B" "Table 2B-5" 2 8 FALSE "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE "CLSI 2015" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -15624,8 +16642,6 @@ "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2015" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE "CLSI 2015" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 3" 1 4 FALSE "CLSI 2015" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE @@ -15642,8 +16658,6 @@ "CLSI 2015" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2015" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE @@ -15655,47 +16669,34 @@ "CLSI 2015" "MIC" "Haemophilus" 3 "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE "CLSI 2015" "DISK" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE "CLSI 2015" "MIC" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2015" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2015" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2015" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2015" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2015" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2015" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2015" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2015" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE "CLSI 2015" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Sulfonamide" "Table 2C" 256 512 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2015" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2015" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2015" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2015" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 16" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE @@ -15728,8 +16729,6 @@ "CLSI 2015" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE "CLSI 2015" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE "CLSI 2015" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE @@ -15737,8 +16736,6 @@ "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2015" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE "CLSI 2015" "DISK" "Aeromonas" 3 "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE @@ -15754,7 +16751,7 @@ "CLSI 2015" "MIC" "Eikenella" 3 "Tetracycline" "M45 Table 7" 2 8 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2015" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2015" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 16" 4 2048 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -15776,16 +16773,10 @@ "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" 2 8 FALSE "CLSI 2015" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 16" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2015" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2015" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Ticarcillin" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Ticarcillin" "Table 2B-2" 16 128 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Ticarcillin" "Table 2B-5" 16 128 FALSE @@ -15793,31 +16784,19 @@ "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin" "Table 2B-1" 16 128 FALSE "CLSI 2015" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2015" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2015" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2015" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2015" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2015" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Telithromycin" "Table 2E" "15ug" 15 11 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Telithromycin" "Table 2E" 4 16 FALSE "CLSI 2015" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2015" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2015" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2015" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE "CLSI 2015" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Tulathromycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2015" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2015" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2015" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -15839,8 +16818,6 @@ "CLSI 2015" "MIC" "Plesiomonas" 3 "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE "CLSI 2015" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2015" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE -"CLSI 2015" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2015" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2015" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 3" 4 2048 FALSE "CLSI 2015" "MIC" "Cutibacterium acnes" 2 "Vancomycin" "Table 2J-2" 2 4 FALSE @@ -15849,14 +16826,14 @@ "CLSI 2015" "MIC" "Granulicatella" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2015" "MIC" "Lactobacillus" 3 "Vancomycin" "M45 Table 9" 2 16 FALSE "CLSI 2015" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2015" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2015" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2015" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2015" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE "CLSI 2015" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" "30ug" 17 6 FALSE "CLSI 2015" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2015" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2015" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2015" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2015" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug" 18 13 FALSE "CLSI 2014" "MIC" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE "CLSI 2014" "MIC" "Aggregatibacter" 3 "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE @@ -15872,8 +16849,6 @@ "CLSI 2014" "DISK" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug" 27 6 FALSE "CLSI 2014" "MIC" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE "CLSI 2014" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE @@ -15884,8 +16859,6 @@ "CLSI 2014" "MIC" "Plesiomonas" 3 "Amikacin" "M45 Table 2" 16 64 FALSE "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2014" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE "CLSI 2014" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE "CLSI 2014" "MIC" "Cardiobacterium" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE @@ -15906,8 +16879,7 @@ "CLSI 2014" "DISK" "Streptococcus" 3 "Ampicillin" "Table 2H-1" "10ug" 24 6 FALSE "CLSI 2014" "MIC" "Streptococcus" 3 "Ampicillin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2014" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE "CLSI 2014" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE @@ -15919,10 +16891,6 @@ "CLSI 2014" "MIC" "Plesiomonas" 3 "Aztreonam" "M45 Table 2" 4 16 FALSE "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2014" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2014" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2014" "MIC" "Eikenella" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE @@ -15944,14 +16912,10 @@ "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2014" "MIC" "Vibrio cholerae" 2 "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" "10ug" 29 6 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" 0.5 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE @@ -15972,30 +16936,18 @@ "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" 8 32 FALSE "CLSI 2014" "MIC" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2014" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 12" 8 32 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE "CLSI 2014" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" 8 32 FALSE "CLSI 2014" "MIC" "Aggregatibacter" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE @@ -16005,7 +16957,7 @@ "CLSI 2014" "MIC" "Eikenella" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2014" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2014" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2014" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -16030,14 +16982,9 @@ "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" 4 16 FALSE "CLSI 2014" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 16" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE @@ -16051,7 +16998,7 @@ "CLSI 2014" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE "CLSI 2014" "MIC" "Erysipelothrix rhusiopathiae" 2 "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE -"CLSI 2014" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2014" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2014" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -16073,8 +17020,7 @@ "CLSI 2014" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" 1 4 FALSE "CLSI 2014" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2014" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 3" 0.5 4 FALSE "CLSI 2014" "MIC" "Erysipelothrix rhusiopathiae" 2 "Clindamycin" "M45 Table 6" 0.25 1 FALSE "CLSI 2014" "MIC" "Granulicatella" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE @@ -16088,8 +17034,7 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2014" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2014" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2014" "MIC" "Eikenella" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE @@ -16107,39 +17052,27 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 2 4 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Colistin" "Table 2B-5" 2 8 FALSE "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" "10ug" 11 10 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefpodoxime" "Table 2E" 2 2048 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2014" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2014" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2014" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE -"CLSI 2014" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2014" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2014" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 4 FALSE "CLSI 2014" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2014" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2014" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Carbenicillin" "Table 2B-5" 16 64 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" 8 64 FALSE @@ -16170,16 +17103,11 @@ "CLSI 2014" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE @@ -16207,13 +17135,10 @@ "CLSI 2014" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 1 4 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2014" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2014" "DISK" "Oral" "Haemophilus" 3 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE @@ -16227,30 +17152,21 @@ "CLSI 2014" "MIC" "Plesiomonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2014" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 1 4 FALSE "CLSI 2014" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2014" "DISK" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 15 14 TRUE "CLSI 2014" "MIC" "Urine" "Enterobacterales" 5 "Cefazolin" "Table 2A" 16 32 TRUE "CLSI 2014" "MIC" "Aeromonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE "CLSI 2014" "MIC" "Bacillus" 3 "Cefazolin" "M45 Table 3" 8 16 FALSE "CLSI 2014" "MIC" "Plesiomonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Daptomycin" "Table 2D" 4 2048 FALSE "CLSI 2014" "MIC" "Lactobacillus" 3 "Daptomycin" "M45 Table 9" 4 2048 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2014" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2014" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -16259,8 +17175,6 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 18 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Doripenem" "Table 2B-2" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Doripenem" "Table 2E" "10ug" 16 6 FALSE @@ -16270,8 +17184,6 @@ "CLSI 2014" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE "CLSI 2014" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 16" 1 2048 FALSE @@ -16281,7 +17193,7 @@ "CLSI 2014" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 3" 2 8 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2014" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2014" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 16" 4 2048 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2014" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 13" "30ug" 23 6 FALSE "CLSI 2014" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 13" 0.5 2048 FALSE @@ -16291,20 +17203,14 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2014" "MIC" "Vibrio cholerae" 2 "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE "CLSI 2014" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 16" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2014" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2014" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2014" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2014" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2014" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" "10ug" 36 31 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" 0.5 2 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2014" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 3" 0.5 8 FALSE "CLSI 2014" "MIC" "Campylobacter" 3 "Erythromycin" "M45 Table 3" 8 32 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Erythromycin" "Table 2D" "15ug" 23 13 FALSE @@ -16324,8 +17230,7 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE "CLSI 2014" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 2" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE @@ -16335,9 +17240,6 @@ "CLSI 2014" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE "CLSI 2014" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE @@ -16360,24 +17262,15 @@ "CLSI 2014" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 1 4 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 25 18 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 2 16 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" 0.25 1 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Fosfomycin" "Table 2D" 64 256 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2014" "MIC" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE @@ -16386,12 +17279,10 @@ "CLSI 2014" "MIC" "Plesiomonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2014" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2014" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2014" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2014" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2014" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2014" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2014" "MIC" "Abiotrophia" 3 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE @@ -16414,18 +17305,13 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE "CLSI 2014" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE @@ -16433,7 +17319,7 @@ "CLSI 2014" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 3" 4 16 FALSE "CLSI 2014" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2014" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2014" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2014" "MIC" "Leuconostoc" 3 "Gentamicin" "M45 Table 10" 4 16 FALSE "CLSI 2014" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 9" 4 16 FALSE @@ -16445,8 +17331,6 @@ "CLSI 2014" "DISK" "Staphylococcus" 3 "Gentamicin" "Table 2C" "10ug" 15 12 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Gentamicin" "Table 2C" 4 16 FALSE "CLSI 2014" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 16" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE @@ -16459,8 +17343,6 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2014" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 2 8 FALSE @@ -16485,10 +17367,7 @@ "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" 2 8 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE "CLSI 2014" "MIC" "Lactobacillus" 3 "Linezolid" "M45 Table 9" 4 2048 FALSE @@ -16500,8 +17379,6 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Lomefloxacin" "Table 2E" 2 2048 FALSE @@ -16511,16 +17388,10 @@ "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2014" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE @@ -16535,7 +17406,7 @@ "CLSI 2014" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE "CLSI 2014" "MIC" "Erysipelothrix rhusiopathiae" 2 "Levofloxacin" "M45 Table 6" 2 2048 FALSE -"CLSI 2014" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2014" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2014" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE @@ -16562,13 +17433,8 @@ "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2014" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2014" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 2 8 FALSE @@ -16594,10 +17460,7 @@ "CLSI 2014" "MIC" "Streptococcus" 3 "Meropenem" "Table 2H-1" 0.5 2048 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" "Table 2G" 0.25 1 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Mezlocillin" "Table 2B-2" "75ug" 21 17 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Mezlocillin" "Table 2B-2" 16 128 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Mezlocillin" "Table 2B-5" 16 128 FALSE @@ -16609,8 +17472,6 @@ "CLSI 2014" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2014" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Minocycline" "Table 2B-2" 4 16 FALSE "CLSI 2014" "DISK" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE @@ -16625,26 +17486,16 @@ "CLSI 2014" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2014" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2014" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Norfloxacin" "Table 2D" 4 16 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Norfloxacin" "Table 2B-5" 4 16 FALSE @@ -16652,8 +17503,6 @@ "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" 4 16 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Norfloxacin" "Table 2C" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Ofloxacin" "Table 2E" 2 2048 FALSE @@ -16671,17 +17520,12 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" 2 8 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 2 4 FALSE -"CLSI 2014" "DISK" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE -"CLSI 2014" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2014" "DISK" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2014" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2014" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2014" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2014" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2014" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" "M45 Table 7" 1 4 FALSE "CLSI 2014" "MIC" "Bacillus" 3 "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE @@ -16710,26 +17554,17 @@ "CLSI 2014" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2014" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2014" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin" "Table 2B-5" 16 128 FALSE "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 2 4 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Polymyxin B" "Table 2B-5" 2 8 FALSE "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE "CLSI 2014" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -16738,8 +17573,6 @@ "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2014" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE "CLSI 2014" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 3" 1 4 FALSE "CLSI 2014" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE @@ -16756,8 +17589,6 @@ "CLSI 2014" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2014" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE @@ -16769,47 +17600,34 @@ "CLSI 2014" "MIC" "Haemophilus" 3 "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE "CLSI 2014" "DISK" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE "CLSI 2014" "MIC" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2014" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2014" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2014" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2014" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2014" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2014" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2014" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2014" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE "CLSI 2014" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Sulfonamide" "Table 2C" 256 512 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2014" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2014" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2014" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2014" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 16" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE @@ -16842,8 +17660,6 @@ "CLSI 2014" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE "CLSI 2014" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE "CLSI 2014" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE @@ -16851,8 +17667,6 @@ "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2014" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE "CLSI 2014" "DISK" "Aeromonas" 3 "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE @@ -16868,7 +17682,7 @@ "CLSI 2014" "MIC" "Eikenella" 3 "Tetracycline" "M45 Table 7" 2 8 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2014" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2014" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 16" 4 2048 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -16890,16 +17704,10 @@ "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" 2 8 FALSE "CLSI 2014" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 16" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2014" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Ticarcillin" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Ticarcillin" "Table 2B-2" 16 128 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Ticarcillin" "Table 2B-5" 16 128 FALSE @@ -16907,29 +17715,19 @@ "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin" "Table 2B-1" 16 128 FALSE "CLSI 2014" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2014" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2014" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2014" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2014" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2014" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Telithromycin" "Table 2E" "15ug" 15 11 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Telithromycin" "Table 2E" 4 16 FALSE "CLSI 2014" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2014" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2014" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2014" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE "CLSI 2014" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2014" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2014" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2014" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -16951,8 +17749,6 @@ "CLSI 2014" "MIC" "Plesiomonas" 3 "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE "CLSI 2014" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2014" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE -"CLSI 2014" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2014" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2014" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 3" 4 2048 FALSE "CLSI 2014" "DISK" "Enterococcus" 3 "Vancomycin" "Table 2D" "30ug" 17 14 FALSE @@ -16960,14 +17756,14 @@ "CLSI 2014" "MIC" "Granulicatella" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2014" "MIC" "Lactobacillus" 3 "Vancomycin" "M45 Table 9" 2 16 FALSE "CLSI 2014" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2014" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2014" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2014" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2014" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE "CLSI 2014" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" "30ug" 17 6 FALSE "CLSI 2014" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2014" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2014" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2014" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2014" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug" 18 13 FALSE "CLSI 2013" "MIC" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE "CLSI 2013" "MIC" "Aggregatibacter" 3 "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE @@ -16983,8 +17779,6 @@ "CLSI 2013" "DISK" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug" 27 6 FALSE "CLSI 2013" "MIC" "Pasteurella" 3 "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE "CLSI 2013" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE @@ -16995,8 +17789,6 @@ "CLSI 2013" "MIC" "Plesiomonas" 3 "Amikacin" "M45 Table 2" 16 64 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2013" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE "CLSI 2013" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE "CLSI 2013" "MIC" "Cardiobacterium" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE @@ -17017,8 +17809,7 @@ "CLSI 2013" "DISK" "Streptococcus" 3 "Ampicillin" "Table 2H-1" "10ug" 24 6 FALSE "CLSI 2013" "MIC" "Streptococcus" 3 "Ampicillin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2013" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE "CLSI 2013" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE @@ -17030,10 +17821,6 @@ "CLSI 2013" "MIC" "Plesiomonas" 3 "Aztreonam" "M45 Table 2" 4 16 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2013" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2013" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2013" "MIC" "Eikenella" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE @@ -17055,14 +17842,10 @@ "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2013" "MIC" "Vibrio cholerae" 2 "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" "10ug" 29 6 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" 0.5 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE @@ -17083,30 +17866,18 @@ "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Ceftazidime" "Table 2B-1" 8 32 FALSE "CLSI 2013" "MIC" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2013" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 12" 8 32 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE "CLSI 2013" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" 8 32 FALSE "CLSI 2013" "MIC" "Aggregatibacter" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE @@ -17116,7 +17887,7 @@ "CLSI 2013" "MIC" "Eikenella" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2013" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2013" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2013" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -17141,14 +17912,9 @@ "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" 4 16 FALSE "CLSI 2013" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 16" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE @@ -17162,7 +17928,7 @@ "CLSI 2013" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE "CLSI 2013" "MIC" "Erysipelothrix rhusiopathiae" 2 "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE -"CLSI 2013" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2013" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2013" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -17186,8 +17952,7 @@ "CLSI 2013" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" 1 4 FALSE "CLSI 2013" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2013" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 3" 0.5 4 FALSE "CLSI 2013" "MIC" "Erysipelothrix rhusiopathiae" 2 "Clindamycin" "M45 Table 6" 0.25 1 FALSE "CLSI 2013" "MIC" "Granulicatella" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE @@ -17201,8 +17966,7 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2013" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2013" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2013" "MIC" "Eikenella" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE @@ -17220,39 +17984,27 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 2 4 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Colistin" "Table 2B-5" 2 8 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" "10ug" 11 10 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefpodoxime" "Table 2E" 2 2048 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2013" "DISK" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" "30ug" 30 6 FALSE "CLSI 2013" "MIC" "Haemophilus influenzae" 2 "Ceftaroline" "Table 2E" 0.5 2048 FALSE -"CLSI 2013" "DISK" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE -"CLSI 2013" "MIC" "Staphylococcus aureus aureus" 1 "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2013" "DISK" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2013" "MIC" "Staphylococcus aureus" 2 "Ceftaroline" "Table 2C" 1 4 FALSE "CLSI 2013" "DISK" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" "30ug" 26 6 FALSE "CLSI 2013" "MIC" "Streptococcus" 3 "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE "CLSI 2013" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftaroline" "Table 2G" 0.5 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ceftaroline" "Generic rules" "30ug" 0.5 2 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Carbenicillin" "Table 2B-5" 16 64 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" 8 64 FALSE @@ -17283,16 +18035,11 @@ "CLSI 2013" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE @@ -17320,13 +18067,10 @@ "CLSI 2013" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 1 4 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2013" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2013" "DISK" "Oral" "Haemophilus" 3 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE @@ -17340,28 +18084,19 @@ "CLSI 2013" "MIC" "Plesiomonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2013" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 1 4 FALSE "CLSI 2013" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2013" "MIC" "Aeromonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE "CLSI 2013" "MIC" "Bacillus" 3 "Cefazolin" "M45 Table 3" 8 16 FALSE "CLSI 2013" "MIC" "Plesiomonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" "30ug" 38 6 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Daptomycin" "Table 2D" 4 2048 FALSE "CLSI 2013" "MIC" "Lactobacillus" 3 "Daptomycin" "M45 Table 9" 4 2048 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2013" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2013" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -17370,8 +18105,6 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Doripenem" "Table 2E" "10ug" 16 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Doripenem" "Table 2E" 1 2048 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE @@ -17379,8 +18112,6 @@ "CLSI 2013" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE "CLSI 2013" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 16" 1 2048 FALSE @@ -17390,7 +18121,7 @@ "CLSI 2013" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 3" 2 8 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2013" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2013" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 16" 4 2048 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2013" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 13" "30ug" 23 6 FALSE "CLSI 2013" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 13" 0.5 2048 FALSE @@ -17400,20 +18131,14 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Doxycycline" "Table 2G" 0.25 1 FALSE "CLSI 2013" "MIC" "Vibrio cholerae" 2 "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE "CLSI 2013" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 16" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2013" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2013" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2013" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2013" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2013" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" "10ug" 36 31 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" 0.5 2 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2013" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 3" 0.5 8 FALSE "CLSI 2013" "MIC" "Campylobacter" 3 "Erythromycin" "M45 Table 3" 8 32 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Erythromycin" "Table 2D" "15ug" 23 13 FALSE @@ -17433,8 +18158,7 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE "CLSI 2013" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 2" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE @@ -17444,9 +18168,6 @@ "CLSI 2013" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE @@ -17468,24 +18189,15 @@ "CLSI 2013" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 1 4 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" 0.25 1 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Fosfomycin" "Table 2D" 64 256 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2013" "MIC" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE @@ -17494,12 +18206,10 @@ "CLSI 2013" "MIC" "Plesiomonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2013" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2013" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2013" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2013" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2013" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2013" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2013" "MIC" "Abiotrophia" 3 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE @@ -17522,18 +18232,13 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE "CLSI 2013" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE @@ -17541,7 +18246,7 @@ "CLSI 2013" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 3" 4 16 FALSE "CLSI 2013" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2013" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2013" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2013" "MIC" "Leuconostoc" 3 "Gentamicin" "M45 Table 10" 4 16 FALSE "CLSI 2013" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 9" 4 16 FALSE @@ -17553,8 +18258,6 @@ "CLSI 2013" "DISK" "Staphylococcus" 3 "Gentamicin" "Table 2C" "10ug" 15 12 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Gentamicin" "Table 2C" 4 16 FALSE "CLSI 2013" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 16" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE @@ -17567,8 +18270,6 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2013" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 16 13 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 4 16 FALSE @@ -17593,10 +18294,7 @@ "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Imipenem" "Table 2B-1" 2 8 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE "CLSI 2013" "MIC" "Lactobacillus" 3 "Linezolid" "M45 Table 9" 4 2048 FALSE @@ -17608,8 +18306,6 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Lomefloxacin" "Table 2E" 2 2048 FALSE @@ -17619,16 +18315,10 @@ "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2013" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE @@ -17643,7 +18333,7 @@ "CLSI 2013" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE "CLSI 2013" "MIC" "Erysipelothrix rhusiopathiae" 2 "Levofloxacin" "M45 Table 6" 2 2048 FALSE -"CLSI 2013" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2013" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2013" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE @@ -17669,13 +18359,8 @@ "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2013" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2013" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 16 13 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 4 16 FALSE @@ -17701,10 +18386,7 @@ "CLSI 2013" "MIC" "Streptococcus" 3 "Meropenem" "Table 2H-1" 0.5 2048 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" "Table 2G" 0.25 1 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Mezlocillin" "Table 2B-2" "75ug" 21 17 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Mezlocillin" "Table 2B-2" 16 128 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Mezlocillin" "Table 2B-5" 16 128 FALSE @@ -17716,8 +18398,6 @@ "CLSI 2013" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2013" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Minocycline" "Table 2B-2" 4 16 FALSE "CLSI 2013" "DISK" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE @@ -17732,26 +18412,16 @@ "CLSI 2013" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2013" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2013" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Norfloxacin" "Table 2D" 4 16 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Norfloxacin" "Table 2B-5" 4 16 FALSE @@ -17759,8 +18429,6 @@ "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" 4 16 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Norfloxacin" "Table 2C" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Ofloxacin" "Table 2E" 2 2048 FALSE @@ -17777,17 +18445,12 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" 2 8 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 2 4 FALSE -"CLSI 2013" "DISK" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE -"CLSI 2013" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2013" "DISK" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2013" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2013" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2013" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2013" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2013" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" "M45 Table 7" 1 4 FALSE "CLSI 2013" "MIC" "Bacillus" 3 "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE @@ -17816,26 +18479,17 @@ "CLSI 2013" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2013" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2013" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin" "Table 2B-5" 16 128 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 2 4 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Polymyxin B" "Table 2B-5" 2 8 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE "CLSI 2013" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE @@ -17844,8 +18498,6 @@ "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2013" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE "CLSI 2013" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 3" 1 4 FALSE "CLSI 2013" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE @@ -17862,8 +18514,6 @@ "CLSI 2013" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2013" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE @@ -17875,47 +18525,34 @@ "CLSI 2013" "MIC" "Haemophilus" 3 "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE "CLSI 2013" "DISK" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE "CLSI 2013" "MIC" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2013" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2013" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2013" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2013" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2013" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2013" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2013" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2013" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE "CLSI 2013" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Sulfonamide" "Table 2C" 256 512 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2013" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2013" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2013" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2013" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 16" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE @@ -17948,8 +18585,6 @@ "CLSI 2013" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE "CLSI 2013" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE "CLSI 2013" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE @@ -17957,8 +18592,6 @@ "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" "75ug" 24 15 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE "CLSI 2013" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE "CLSI 2013" "DISK" "Aeromonas" 3 "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE @@ -17974,7 +18607,7 @@ "CLSI 2013" "MIC" "Eikenella" 3 "Tetracycline" "M45 Table 7" 2 8 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2013" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2013" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 16" 4 2048 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -17996,16 +18629,10 @@ "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" 2 8 FALSE "CLSI 2013" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 16" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2013" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Ticarcillin" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Ticarcillin" "Table 2B-2" 16 128 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Ticarcillin" "Table 2B-5" 16 128 FALSE @@ -18013,29 +18640,19 @@ "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin" "Table 2B-1" 16 128 FALSE "CLSI 2013" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2013" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2013" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2013" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2013" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2013" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Telithromycin" "Table 2E" "15ug" 15 11 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Telithromycin" "Table 2E" 4 16 FALSE "CLSI 2013" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2013" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2013" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2013" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE "CLSI 2013" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2013" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2013" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2013" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -18057,8 +18674,6 @@ "CLSI 2013" "MIC" "Plesiomonas" 3 "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE "CLSI 2013" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2013" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE -"CLSI 2013" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2013" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2013" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 3" 4 2048 FALSE "CLSI 2013" "DISK" "Enterococcus" 3 "Vancomycin" "Table 2D" "30ug" 17 14 FALSE @@ -18066,14 +18681,14 @@ "CLSI 2013" "MIC" "Granulicatella" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2013" "MIC" "Lactobacillus" 3 "Vancomycin" "M45 Table 9" 2 16 FALSE "CLSI 2013" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2013" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2013" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2013" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2013" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE "CLSI 2013" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" "30ug" 17 6 FALSE "CLSI 2013" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2013" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2013" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2013" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2013" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug" 18 13 FALSE "CLSI 2012" "MIC" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE "CLSI 2012" "MIC" "Aggregatibacter" 3 "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE @@ -18091,8 +18706,6 @@ "CLSI 2012" "DISK" "Staphylococcus" 3 "Amoxicillin/clavulanic acid" "Table 2C" "20ug" 20 19 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Amoxicillin/clavulanic acid" "Table 2C" 4 8 FALSE "CLSI 2012" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Amikacin" "Table 2B-2" 16 64 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE @@ -18105,8 +18718,6 @@ "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Amikacin" "Table 2B-1" 16 64 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Amikacin" "Table 2C" "30ug" 17 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Amikacin" "Table 2C" 16 64 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2012" "MIC" "Aggregatibacter" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE "CLSI 2012" "MIC" "Bacillus" 3 "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE "CLSI 2012" "MIC" "Cardiobacterium" 3 "Ampicillin" "M45 Table 7" 1 4 FALSE @@ -18129,8 +18740,7 @@ "CLSI 2012" "DISK" "Streptococcus" 3 "Ampicillin" "Table 2H-1" "10ug" 24 6 FALSE "CLSI 2012" "MIC" "Streptococcus" 3 "Ampicillin" "Table 2H-1" 0.25 2048 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" "Table 2H-2" 0.25 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Ampicillin" "M45 Table 1" 0.25 8 FALSE "CLSI 2012" "MIC" "Pasteurella" 3 "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE "CLSI 2012" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" "Table 2G" 2 8 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE @@ -18142,10 +18752,6 @@ "CLSI 2012" "MIC" "Plesiomonas" 3 "Aztreonam" "M45 Table 2" 4 16 FALSE "CLSI 2012" "DISK" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Aztreonam" "Table 2B-1" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2012" "MIC" "Aggregatibacter" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2012" "MIC" "Cardiobacterium" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE "CLSI 2012" "MIC" "Eikenella" 3 "Azithromycin" "M45 Table 7" 4 2048 FALSE @@ -18167,14 +18773,10 @@ "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "Table 2H-2" 0.5 2 FALSE "CLSI 2012" "MIC" "Vibrio cholerae" 2 "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefetamet" "Table 2E" "10ug" 18 14 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefetamet" "Table 2E" 4 16 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" "10ug" 29 6 FALSE "CLSI 2012" "MIC" "Neisseria gonorrhoeae" 2 "Cefetamet" "Table 2F" 0.5 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Ceftazidime" "Table 2B-2" 8 32 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE @@ -18197,38 +18799,26 @@ "CLSI 2012" "MIC" "Stenotrophomonas maltophilia" 2 "Ceftazidime" "Table 2B-4" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Ceftazidime" "Table 2C" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Ceftazidime" "Table 2C" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefdinir" "Table 2E" "5ug" 20 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefdinir" "Table 2E" 1 2048 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefdinir" "Table 2C" "5ug" 20 16 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefdinir" "Table 2C" 1 4 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" "Table 2G" 0.5 2 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefaclor" "Table 2E" "30ug" 20 16 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefaclor" "Table 2E" 8 32 FALSE "CLSI 2012" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" "M45 Table 12" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefaclor" "Table 2C" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefaclor" "Table 2C" 8 32 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" "Table 2G" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cephalothin" "Table 2C" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cephalothin" "Table 2C" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefixime" "Table 2E" "5ug" 21 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefixime" "Table 2E" 1 2048 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" "5ug" 31 6 FALSE "CLSI 2012" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" "Table 2F" 0.25 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Cefoperazone" "Table 2B-5" 16 64 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefoperazone" "Table 2C" "75ug" 21 15 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefoperazone" "Table 2C" 16 64 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE "CLSI 2012" "MIC" "Aeromonas" 3 "Chloramphenicol" "M45 Table 2" 8 32 FALSE "CLSI 2012" "MIC" "Aggregatibacter" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE @@ -18238,7 +18828,7 @@ "CLSI 2012" "MIC" "Eikenella" 3 "Chloramphenicol" "M45 Table 7" 4 16 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Chloramphenicol" "Table 2D" 8 32 FALSE -"CLSI 2012" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2012" "MIC" "Francisella tularensis" 2 "Chloramphenicol" "M45 Table 16" 8 2048 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Chloramphenicol" "Table 2B-5" 8 32 FALSE "CLSI 2012" "MIC" "Granulicatella" 3 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE @@ -18263,16 +18853,11 @@ "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "Table 2H-2" 4 16 FALSE "CLSI 2012" "MIC" "Yersinia pestis" 2 "Chloramphenicol" "M45 Table 16" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Chloramphenicol" "M45 Table 1" 4 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefonicid" "Table 2E" "30ug" 20 16 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefonicid" "Table 2E" 4 16 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefonicid" "Table 2C" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefonicid" "Table 2C" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Ciprofloxacin" "Table 2B-2" 1 4 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE @@ -18286,7 +18871,7 @@ "CLSI 2012" "DISK" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Ciprofloxacin" "Table 2D" 1 4 FALSE "CLSI 2012" "MIC" "Erysipelothrix rhusiopathiae" 2 "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE -"CLSI 2012" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2012" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Ciprofloxacin" "Table 2B-5" 1 4 FALSE "CLSI 2012" "MIC" "Granulicatella" 3 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Ciprofloxacin" "Table 2E" "5ug" 21 6 FALSE @@ -18310,8 +18895,7 @@ "CLSI 2012" "DISK" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Ciprofloxacin" "Table 2C" 1 4 FALSE "CLSI 2012" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Ciprofloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2012" "MIC" "Bacillus" 3 "Clindamycin" "M45 Table 3" 0.5 4 FALSE "CLSI 2012" "MIC" "Erysipelothrix rhusiopathiae" 2 "Clindamycin" "M45 Table 6" 0.25 1 FALSE "CLSI 2012" "MIC" "Granulicatella" 3 "Clindamycin" "M45 Table 1" 0.25 1 FALSE @@ -18325,8 +18909,7 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" "Table 2G" 0.25 1 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Clindamycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2012" "MIC" "Aggregatibacter" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2012" "MIC" "Cardiobacterium" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE "CLSI 2012" "MIC" "Eikenella" 3 "Clarithromycin" "M45 Table 7" 8 32 FALSE @@ -18344,20 +18927,14 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" "Table 2G" 0.25 1 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE "CLSI 2012" "MIC" "Neisseria gonorrhoeae" 2 "Cefmetazole" "Table 2F" 2 8 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefmetazole" "Table 2C" "30ug" 16 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefmetazole" "Table 2C" 16 64 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Colistin" "Table 2B-2" 2 4 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Colistin" "Table 2B-5" 2 8 FALSE "CLSI 2012" "DISK" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" "10ug" 11 10 FALSE "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Colistin" "Table 2B-1" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefpodoxime" "Table 2E" "10ug" 21 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefpodoxime" "Table 2E" 2 2048 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "Table 2F" "10ug" 29 6 FALSE @@ -18365,15 +18942,11 @@ "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefpodoxime" "Table 2C" "10ug" 21 17 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefpodoxime" "Table 2C" 2 8 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" "Table 2G" 0.5 2 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefprozil" "Table 2E" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefprozil" "Table 2E" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefprozil" "Table 2C" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefprozil" "Table 2C" 8 32 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" "Table 2G" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Carbenicillin" "Table 2B-5" 16 64 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Ceftriaxone" "Table 2B-2" 8 64 FALSE @@ -18406,18 +18979,13 @@ "CLSI 2012" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" "Table 2G" 1 4 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "Table 2H-2" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Ceftriaxone" "M45 Table 1" 1 4 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Ceftibuten" "Table 2E" "30ug" 28 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Ceftibuten" "Table 2E" 2 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" "30ug" 26 19 FALSE "CLSI 2012" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" "Table 2F" 2 8 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefotetan" "Table 2C" "30ug" 16 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefotetan" "Table 2C" 16 64 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Cefotaxime" "Table 2B-2" 8 64 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE @@ -18447,15 +19015,12 @@ "CLSI 2012" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" "Table 2G" 1 4 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "Table 2H-2" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Cefotaxime" "M45 Table 1" 1 4 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefuroxime axetil" "Table 2E" 4 16 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefuroxime axetil" "Table 2C" "30ug" 23 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefuroxime axetil" "Table 2C" 4 32 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" "Table 2G" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Aeromonas" 3 "Cefuroxime" "M45 Table 2" 8 32 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE @@ -18471,15 +19036,11 @@ "CLSI 2012" "MIC" "Oral" "Staphylococcus" 3 "Cefuroxime" "Table 2C" 4 32 FALSE "CLSI 2012" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 0.5 2 FALSE "CLSI 2012" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" "Table 2G" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2012" "MIC" "Aeromonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE "CLSI 2012" "MIC" "Bacillus" 3 "Cefazolin" "M45 Table 3" 8 16 FALSE "CLSI 2012" "MIC" "Plesiomonas" 3 "Cefazolin" "M45 Table 2" 1 4 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefazolin" "Table 2C" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefazolin" "Table 2C" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Ceftizoxime" "Table 2B-5" 8 64 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Ceftizoxime" "Table 2E" "30ug" 26 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Ceftizoxime" "Table 2E" 2 2048 FALSE @@ -18487,16 +19048,11 @@ "CLSI 2012" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "Table 2F" 0.5 2048 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Ceftizoxime" "Table 2C" "30ug" 20 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Ceftizoxime" "Table 2C" 8 64 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Daptomycin" "Table 2D" 4 2048 FALSE "CLSI 2012" "MIC" "Lactobacillus" 3 "Daptomycin" "M45 Table 9" 4 2048 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Daptomycin" "Table 2C" 1 2048 FALSE "CLSI 2012" "DISK" "Streptococcus" 3 "Daptomycin" "Table 2H-1" "30ug" 16 6 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Dirithromycin" "Table 2C" 2 8 FALSE "CLSI 2012" "DISK" "Streptococcus" 3 "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE @@ -18505,8 +19061,6 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" "Table 2G" 0.5 2 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Doripenem" "Table 2E" "10ug" 16 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Doripenem" "Table 2E" 1 2048 FALSE "CLSI 2012" "DISK" "Pseudomonas aeruginosa" 2 "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE @@ -18516,8 +19070,6 @@ "CLSI 2012" "MIC" "Streptococcus" 3 "Doripenem" "Table 2H-1" 0.125 2048 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Doripenem" "Table 2G" 1 2048 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Doripenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Doxycycline" "Table 2B-2" 4 16 FALSE "CLSI 2012" "MIC" "Bacillus anthracis" 2 "Doxycycline" "M45 Table 16" 1 2048 FALSE @@ -18527,7 +19079,7 @@ "CLSI 2012" "MIC" "Campylobacter" 3 "Doxycycline" "M45 Table 3" 2 8 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Doxycycline" "Table 2D" "30ug" 16 12 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Doxycycline" "Table 2D" 4 16 FALSE -"CLSI 2012" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2012" "MIC" "Francisella tularensis" 2 "Doxycycline" "M45 Table 16" 4 2048 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Doxycycline" "Table 2B-5" 4 16 FALSE "CLSI 2012" "DISK" "Pasteurella" 3 "Doxycycline" "M45 Table 13" "30ug" 23 6 FALSE "CLSI 2012" "MIC" "Pasteurella" 3 "Doxycycline" "M45 Table 13" 0.5 2048 FALSE @@ -18535,20 +19087,14 @@ "CLSI 2012" "MIC" "Staphylococcus" 3 "Doxycycline" "Table 2C" 4 16 FALSE "CLSI 2012" "MIC" "Vibrio cholerae" 2 "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE "CLSI 2012" "MIC" "Yersinia pestis" 2 "Doxycycline" "M45 Table 16" 4 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2012" "DISK" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2012" "MIC" "Histophilus somni" 2 "Enrofloxacin" "Vet Table" 0.25 2 FALSE "CLSI 2012" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2012" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2012" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" "10ug" 36 31 FALSE "CLSI 2012" "MIC" "Neisseria gonorrhoeae" 2 "Enoxacin" "Table 2F" 0.5 2 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Enoxacin" "Table 2C" "10ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Enoxacin" "Table 2C" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2012" "MIC" "Bacillus" 3 "Erythromycin" "M45 Table 3" 0.5 8 FALSE "CLSI 2012" "MIC" "Campylobacter" 3 "Erythromycin" "M45 Table 3" 8 32 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Erythromycin" "Table 2D" "15ug" 23 13 FALSE @@ -18568,8 +19114,7 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" "Table 2G" 0.25 1 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "Table 2H-2" 0.25 1 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Erythromycin" "M45 Table 1" 0.25 1 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE "CLSI 2012" "MIC" "Aeromonas" 3 "Ertapenem" "M45 Table 2" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Ertapenem" "Table 2E" "10ug" 19 6 FALSE @@ -18581,9 +19126,6 @@ "CLSI 2012" "MIC" "Streptococcus" 3 "Ertapenem" "Table 2H-1" 1 2048 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" "Table 2G" 1 4 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" "Table 2H-2" 1 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.5 2 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Cefepime" "Table 2B-2" 8 32 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE @@ -18607,24 +19149,15 @@ "CLSI 2012" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" "Table 2G" 1 4 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "Table 2H-2" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Fleroxacin" "Table 2E" "5ug" 19 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Fleroxacin" "Table 2E" 2 2048 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE "CLSI 2012" "MIC" "Neisseria gonorrhoeae" 2 "Fleroxacin" "Table 2F" 0.25 1 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Fleroxacin" "Table 2C" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Fosfomycin" "Table 2D" 64 256 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Aeromonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE @@ -18633,12 +19166,10 @@ "CLSI 2012" "MIC" "Plesiomonas" 3 "Cefoxitin" "M45 Table 2" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2012" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE -"CLSI 2012" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2012" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2012" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" "Table 2C" 4 8 FALSE "CLSI 2012" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE "CLSI 2012" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" "Table 2C" 4 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2012" "MIC" "Abiotrophia" 3 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Gatifloxacin" "Table 2B-2" 2 8 FALSE @@ -18661,18 +19192,13 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" "Table 2G" 1 4 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "Table 2H-2" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Gentamicin-high" "Table 2D" 512 560 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Gemifloxacin" "Table 2E" "5ug" 18 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Gemifloxacin" "Table 2E" 0.125 2048 FALSE "CLSI 2012" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Gentamicin" "Table 2B-2" 4 16 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE @@ -18680,7 +19206,7 @@ "CLSI 2012" "MIC" "Bacillus" 3 "Gentamicin" "M45 Table 3" 4 16 FALSE "CLSI 2012" "MIC" "Brucella" 3 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Gentamicin" "Table 2D" 512 560 FALSE -"CLSI 2012" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2012" "MIC" "Francisella tularensis" 2 "Gentamicin" "M45 Table 16" 4 2048 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Gentamicin" "Table 2B-5" 4 16 FALSE "CLSI 2012" "MIC" "Leuconostoc" 3 "Gentamicin" "M45 Table 10" 4 16 FALSE "CLSI 2012" "MIC" "Lactobacillus" 3 "Gentamicin" "M45 Table 9" 4 16 FALSE @@ -18692,8 +19218,6 @@ "CLSI 2012" "DISK" "Staphylococcus" 3 "Gentamicin" "Table 2C" "10ug" 15 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Gentamicin" "Table 2C" 4 16 FALSE "CLSI 2012" "MIC" "Yersinia pestis" 2 "Gentamicin" "M45 Table 16" 4 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Grepafloxacin" "Table 2E" "5ug" 24 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Grepafloxacin" "Table 2E" 0.5 2048 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE @@ -18706,8 +19230,6 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" "Table 2G" 0.5 2 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2012" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Imipenem" "Table 2B-2" "10ug" 16 13 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Imipenem" "Table 2B-2" 4 16 FALSE @@ -18734,12 +19256,9 @@ "CLSI 2012" "DISK" "Staphylococcus" 3 "Imipenem" "Table 2C" "10ug" 16 13 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Imipenem" "Table 2C" 4 16 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" "Table 2G" 0.125 1 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Kanamycin" "Table 2C" "30ug" 18 13 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Kanamycin" "Table 2C" 16 64 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Linezolid" "Table 2D" "30ug" 23 20 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Linezolid" "Table 2D" 2 8 FALSE "CLSI 2012" "MIC" "Lactobacillus" 3 "Linezolid" "M45 Table 9" 4 2048 FALSE @@ -18751,8 +19270,6 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" "Table 2G" 2 2048 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" "30ug" 21 6 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "Table 2H-2" 2 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Lomefloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Lomefloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Lomefloxacin" "Table 2E" 2 2048 FALSE @@ -18762,20 +19279,14 @@ "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Lomefloxacin" "Table 2B-1" 2 8 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Lomefloxacin" "Table 2C" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Loracarbef" "Table 2E" "30ug" 19 15 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Loracarbef" "Table 2E" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Loracarbef" "Table 2C" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Loracarbef" "Table 2C" 8 32 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" "Table 2G" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Latamoxef" "Table 2B-5" 8 64 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Latamoxef" "Table 2C" "30ug" 23 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Latamoxef" "Table 2C" 8 64 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2012" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Levofloxacin" "Table 2B-2" 2 8 FALSE @@ -18790,7 +19301,7 @@ "CLSI 2012" "DISK" "Enterococcus" 3 "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Levofloxacin" "Table 2D" 2 8 FALSE "CLSI 2012" "MIC" "Erysipelothrix rhusiopathiae" 2 "Levofloxacin" "M45 Table 6" 2 2048 FALSE -"CLSI 2012" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2012" "MIC" "Francisella tularensis" 2 "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Levofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2012" "MIC" "Granulicatella" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Levofloxacin" "Table 2E" "5ug" 17 6 FALSE @@ -18815,15 +19326,10 @@ "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "Table 2H-2" 2 8 FALSE "CLSI 2012" "MIC" "Yersinia pestis" 2 "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Cefamandole" "Table 2E" 4 16 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Cefamandole" "Table 2C" "30ug" 18 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Cefamandole" "Table 2C" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2012" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Meropenem" "Table 2B-2" "10ug" 16 13 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Meropenem" "Table 2B-2" 4 16 FALSE @@ -18851,12 +19357,9 @@ "CLSI 2012" "MIC" "Streptococcus" 3 "Meropenem" "Table 2H-1" 0.5 2048 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" "Table 2G" 0.25 1 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" "Table 2H-2" 0.5 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Methicillin" "Table 2C" "5ug" 14 9 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Methicillin" "Table 2C" 8 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Mezlocillin" "Table 2B-2" "75ug" 21 17 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Mezlocillin" "Table 2B-2" 16 128 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Mezlocillin" "Table 2B-5" 16 128 FALSE @@ -18868,8 +19371,6 @@ "CLSI 2012" "MIC" "Staphylococcus" 3 "Moxifloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2012" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" "Table 2G" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Minocycline" "Table 2B-2" 4 16 FALSE "CLSI 2012" "DISK" "Burkholderia cepacia" 2 "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE @@ -18884,30 +19385,20 @@ "CLSI 2012" "MIC" "Stenotrophomonas maltophilia" 2 "Minocycline" "Table 2B-4" 4 16 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Minocycline" "Table 2C" "30ug" 19 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Minocycline" "Table 2C" 4 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Nafcillin" "Table 2C" "1ug" 13 10 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Nafcillin" "Table 2C" 2 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2012" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE "CLSI 2012" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" "Table 2I" 4 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Netilmicin" "Table 2B-2" 8 32 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Netilmicin" "Table 2B-5" 8 32 FALSE "CLSI 2012" "DISK" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Netilmicin" "Table 2B-1" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Netilmicin" "Table 2C" "30ug" 15 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Netilmicin" "Table 2C" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Nitrofurantoin" "Table 2D" 32 128 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Nitrofurantoin" "Table 2C" 32 128 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Norfloxacin" "Table 2D" 4 16 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Norfloxacin" "Table 2B-5" 4 16 FALSE @@ -18915,8 +19406,6 @@ "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Norfloxacin" "Table 2B-1" 4 16 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Norfloxacin" "Table 2C" 4 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Ofloxacin" "Table 2B-5" 2 8 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Ofloxacin" "Table 2E" "5ug" 16 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Ofloxacin" "Table 2E" 2 2048 FALSE @@ -18932,17 +19421,12 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" "Table 2G" 2 8 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "Table 2H-2" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Oxacillin" "Table 2C" 2 4 FALSE -"CLSI 2012" "DISK" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE -"CLSI 2012" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2012" "DISK" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2012" "MIC" "Staphylococcus aureus" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2012" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" "Table 2C" 2 4 FALSE "CLSI 2012" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "Table 2G" "1ug" 20 6 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2012" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2012" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" "M45 Table 7" 1 4 FALSE "CLSI 2012" "MIC" "Bacillus" 3 "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE @@ -18971,26 +19455,17 @@ "CLSI 2012" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 2 8 FALSE "CLSI 2012" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2012" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Piperacillin" "Table 2B-2" 16 128 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Piperacillin" "Table 2B-5" 16 128 FALSE "CLSI 2012" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" "Table 2B-1" 16 128 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Polymyxin B" "Table 2B-2" 2 4 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Polymyxin B" "Table 2B-5" 2 8 FALSE "CLSI 2012" "DISK" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Polymyxin B" "Table 2B-1" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE @@ -19001,8 +19476,6 @@ "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2012" "MIC" "Aggregatibacter" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE "CLSI 2012" "MIC" "Bacillus" 3 "Rifampicin" "M45 Table 3" 1 4 FALSE "CLSI 2012" "MIC" "Cardiobacterium" 3 "Rifampicin" "M45 Table 7" 1 4 FALSE @@ -19019,8 +19492,6 @@ "CLSI 2012" "MIC" "Staphylococcus" 3 "Rifampicin" "Table 2C" 1 4 FALSE "CLSI 2012" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" "5ug" 19 16 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" "Table 2G" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE @@ -19034,47 +19505,34 @@ "CLSI 2012" "MIC" "Plesiomonas" 3 "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Ampicillin/sulbactam" "Table 2C" "10ug" 15 11 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Ampicillin/sulbactam" "Table 2C" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2012" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" "Table 2I" 2 8 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Sulfamethoxazole" "Table 2C" 256 512 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Sulfisoxazole" "Table 2B-5" 256 512 FALSE "CLSI 2012" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" "Table 2I" 2 8 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Sulfisoxazole" "Table 2C" 256 512 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2012" "DISK" "Histophilus somni" 2 "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE "CLSI 2012" "MIC" "Neisseria gonorrhoeae" 2 "Spectinomycin" "Table 2F" 32 128 FALSE "CLSI 2012" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2012" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2012" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Sparfloxacin" "Table 2E" 0.25 2048 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Sparfloxacin" "Table 2C" 0.5 2 FALSE "CLSI 2012" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" "Table 2G" 0.5 2 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Sulfonamide" "Table 2B-5" 256 512 FALSE "CLSI 2012" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" "Table 2I" 2 8 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Sulfonamide" "Table 2C" 256 512 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Streptomycin-high" "Table 2D" 1024 2048 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2012" "MIC" "Brucella" 3 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Streptoduocin" "Table 2D" 1024 2048 FALSE -"CLSI 2012" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2012" "MIC" "Francisella tularensis" 2 "Streptoduocin" "M45 Table 16" 8 2048 FALSE "CLSI 2012" "MIC" "Yersinia pestis" 2 "Streptoduocin" "M45 Table 16" 4 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE @@ -19107,8 +19565,6 @@ "CLSI 2012" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE "CLSI 2012" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE "CLSI 2012" "MIC" "Burkholderia cepacia" 2 "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE @@ -19118,8 +19574,6 @@ "CLSI 2012" "MIC" "Stenotrophomonas maltophilia" 2 "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Ticarcillin/clavulanic acid" "Table 2C" "75/10ug" 23 22 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Ticarcillin/clavulanic acid" "Table 2C" 8 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Tetracycline" "Table 2B-2" 4 16 FALSE "CLSI 2012" "DISK" "Aeromonas" 3 "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE @@ -19135,7 +19589,7 @@ "CLSI 2012" "MIC" "Eikenella" 3 "Tetracycline" "M45 Table 7" 2 8 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Tetracycline" "Table 2D" "30ug" 19 14 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Tetracycline" "Table 2D" 4 16 FALSE -"CLSI 2012" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2012" "MIC" "Francisella tularensis" 2 "Tetracycline" "M45 Table 16" 4 2048 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Tetracycline" "Table 2B-5" 4 16 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Tetracycline" "Table 2E" "30ug" 29 25 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Tetracycline" "Table 2E" 2 8 FALSE @@ -19157,16 +19611,10 @@ "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "Table 2H-2" 2 8 FALSE "CLSI 2012" "MIC" "Yersinia pestis" 2 "Tetracycline" "M45 Table 16" 4 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE "CLSI 2012" "MIC" "Enterococcus" 3 "Teicoplanin" "Table 2D" 8 32 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Teicoplanin" "Table 2C" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Ticarcillin" "Table 2B-2" "75ug" 20 14 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Ticarcillin" "Table 2B-2" 16 128 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Ticarcillin" "Table 2B-5" 16 128 FALSE @@ -19174,24 +19622,16 @@ "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin" "Table 2B-1" 16 128 FALSE "CLSI 2012" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE "CLSI 2012" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2012" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE -"CLSI 2012" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" "Vet Table" 16 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2012" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2012" "MIC" "Pasteurella multocida" 2 "Tilmicosin" "Vet Table" 16 32 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Telithromycin" "Table 2E" "15ug" 15 11 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Telithromycin" "Table 2E" 4 16 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Telithromycin" "Table 2C" "15ug" 22 18 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Telithromycin" "Table 2C" 1 4 FALSE "CLSI 2012" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" "15ug" 19 15 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" "Table 2G" 1 4 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Trimethoprim" "Table 2C" 8 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE "CLSI 2012" "DISK" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE "CLSI 2012" "MIC" "Acinetobacter" 3 "Tobramycin" "Table 2B-2" 4 16 FALSE "CLSI 2012" "MIC" "(unknown Gram-negatives)" 2 "Tobramycin" "Table 2B-5" 4 16 FALSE @@ -19199,8 +19639,6 @@ "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Tobramycin" "Table 2B-1" 4 16 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Tobramycin" "Table 2C" "10ug" 15 12 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Tobramycin" "Table 2C" 4 16 FALSE -"CLSI 2012" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2012" "DISK" "Haemophilus" 3 "Trovafloxacin" "Table 2E" "10ug" 22 6 FALSE "CLSI 2012" "MIC" "Haemophilus" 3 "Trovafloxacin" "Table 2E" 1 2048 FALSE "CLSI 2012" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "Table 2F" "10ug" 34 6 FALSE @@ -19224,7 +19662,6 @@ "CLSI 2012" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE "CLSI 2012" "DISK" "Staphylococcus" 3 "Piperacillin/tazobactam" "Table 2C" "100/10ug" 18 17 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Piperacillin/tazobactam" "Table 2C" 8 16 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2012" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2012" "MIC" "Bacillus" 3 "Vancomycin" "M45 Table 3" 4 2048 FALSE "CLSI 2012" "DISK" "Enterococcus" 3 "Vancomycin" "Table 2D" "30ug" 17 14 FALSE @@ -19232,14 +19669,14 @@ "CLSI 2012" "MIC" "Granulicatella" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2012" "MIC" "Lactobacillus" 3 "Vancomycin" "M45 Table 9" 2 16 FALSE "CLSI 2012" "MIC" "Staphylococcus" 3 "Vancomycin" "Table 2C" 4 32 FALSE -"CLSI 2012" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2012" "MIC" "Staphylococcus aureus" 2 "Vancomycin" "Table 2C" 2 16 FALSE "CLSI 2012" "DISK" "Streptococcus" 3 "Vancomycin" "Table 2H-1" "30ug" 17 6 FALSE "CLSI 2012" "MIC" "Streptococcus" 3 "Vancomycin" "Table 2H-1" 1 2048 FALSE "CLSI 2012" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" "30ug" 17 6 FALSE "CLSI 2012" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" "Table 2G" 1 2048 FALSE "CLSI 2012" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" "30ug" 17 6 FALSE "CLSI 2012" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "Table 2H-2" 1 2048 FALSE -"CLSI 2012" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2012" "MIC" "(unknown name)" 6 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Amoxicillin/clavulanic acid" "20ug" 18 13 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Amoxicillin/clavulanic acid" 8 32 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Amoxicillin/clavulanic acid" 4 8 FALSE @@ -19257,15 +19694,11 @@ "CLSI 2011" "DISK" "Staphylococcus" 3 "Amoxicillin/clavulanic acid" "20/10ug" 20 19 FALSE "CLSI 2011" "MIC" "Staphylococcus" 3 "Amoxicillin/clavulanic acid" 4 8 FALSE "CLSI 2011" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin/clavulanic acid" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Amikacin" "30ug" 17 14 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Amikacin" 16 64 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Amikacin" 16 64 FALSE "CLSI 2011" "DISK" "Plesiomonas" 3 "Amikacin" "30ug" 17 14 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Amikacin" 16 64 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Ampicillin" 1 4 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Ampicillin" 0.25 0.5 FALSE "CLSI 2011" "MIC" "Cardiobacterium" 3 "Ampicillin" 1 4 FALSE @@ -19288,8 +19721,7 @@ "CLSI 2011" "DISK" "Streptococcus" 3 "Ampicillin" "10ug" 24 6 FALSE "CLSI 2011" "MIC" "Streptococcus" 3 "Ampicillin" 0.25 2048 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ampicillin" 0.25 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Ampicillin" 0.25 8 FALSE "CLSI 2011" "MIC" "Pasteurella" 3 "Amoxicillin" 0.5 2048 FALSE "CLSI 2011" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Amoxicillin" 2 8 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Aztreonam" "30ug" 21 17 FALSE @@ -19298,10 +19730,6 @@ "CLSI 2011" "MIC" "Haemophilus" 3 "Aztreonam" 2 2048 FALSE "CLSI 2011" "DISK" "Plesiomonas" 3 "Aztreonam" "30ug" 21 17 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Aztreonam" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Azithromycin" 4 2048 FALSE "CLSI 2011" "MIC" "Cardiobacterium" 3 "Azithromycin" 4 2048 FALSE "CLSI 2011" "MIC" "Eikenella" 3 "Azithromycin" 4 2048 FALSE @@ -19320,14 +19748,10 @@ "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" "15ug" 18 13 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Azithromycin" 0.5 2 FALSE "CLSI 2011" "MIC" "Vibrio cholerae" 2 "Azithromycin" 2 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefetamet" "10ug" 18 14 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefetamet" 4 16 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Cefetamet" "10ug" 29 6 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Cefetamet" 0.5 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Ceftazidime" "30ug" 21 17 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Ceftazidime" 4 16 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Ceftazidime" 8 32 FALSE @@ -19342,36 +19766,24 @@ "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Ceftazidime" 0.5 2048 FALSE "CLSI 2011" "DISK" "Plesiomonas" 3 "Ceftazidime" "30ug" 21 17 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Ceftazidime" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefdinir" "5ug" 20 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefdinir" 1 2048 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefdinir" 0.5 2 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefaclor" "30ug" 20 16 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefaclor" 8 32 FALSE "CLSI 2011" "MIC" "Moraxella catarrhalis" 2 "Cefaclor" 8 32 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefaclor" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefixime" "5ug" 21 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefixime" 1 2048 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Cefixime" "5ug" 31 6 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Cefixime" 0.25 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Chloramphenicol" "30ug" 18 12 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Chloramphenicol" 8 32 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Chloramphenicol" 4 16 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Chloramphenicol" 8 32 FALSE "CLSI 2011" "MIC" "Cardiobacterium" 3 "Chloramphenicol" 4 16 FALSE "CLSI 2011" "MIC" "Eikenella" 3 "Chloramphenicol" 4 16 FALSE -"CLSI 2011" "MIC" "Francisella tularensis tularensis" 1 "Chloramphenicol" 8 2048 FALSE +"CLSI 2011" "MIC" "Francisella tularensis" 2 "Chloramphenicol" 8 2048 FALSE "CLSI 2011" "MIC" "Granulicatella" 3 "Chloramphenicol" 4 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Chloramphenicol" "30ug" 29 25 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Chloramphenicol" 2 8 FALSE @@ -19392,14 +19804,9 @@ "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" "30ug" 21 17 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Chloramphenicol" 4 16 FALSE "CLSI 2011" "MIC" "Yersinia pestis" 2 "Chloramphenicol" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Chloramphenicol" 4 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefonicid" "30ug" 20 16 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefonicid" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Ciprofloxacin" "5ug" 21 15 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Ciprofloxacin" 1 4 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Ciprofloxacin" 1 4 FALSE @@ -19409,7 +19816,7 @@ "CLSI 2011" "MIC" "Cardiobacterium" 3 "Ciprofloxacin" 1 4 FALSE "CLSI 2011" "MIC" "Eikenella" 3 "Ciprofloxacin" 1 4 FALSE "CLSI 2011" "MIC" "Erysipelothrix rhusiopathiae" 2 "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE -"CLSI 2011" "MIC" "Francisella tularensis tularensis" 1 "Ciprofloxacin" 0.5 2048 FALSE +"CLSI 2011" "MIC" "Francisella tularensis" 2 "Ciprofloxacin" 0.5 2048 FALSE "CLSI 2011" "MIC" "Granulicatella" 3 "Ciprofloxacin" 1 4 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Ciprofloxacin" "5ug" 21 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Ciprofloxacin" 1 2048 FALSE @@ -19422,8 +19829,7 @@ "CLSI 2011" "DISK" "Plesiomonas" 3 "Ciprofloxacin" "5ug" 21 15 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Ciprofloxacin" 1 4 FALSE "CLSI 2011" "MIC" "Yersinia pestis" 2 "Ciprofloxacin" 0.25 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Ciprofloxacin" 1 4 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Clindamycin" 0.5 4 FALSE "CLSI 2011" "MIC" "Erysipelothrix rhusiopathiae" 2 "Clindamycin" "M45 Table 6" 0.25 1 FALSE "CLSI 2011" "MIC" "Granulicatella" 3 "Clindamycin" 0.25 1 FALSE @@ -19435,8 +19841,7 @@ "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Clindamycin" 0.25 1 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" "2ug" 19 15 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clindamycin" 0.25 1 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Clindamycin" 0.25 1 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Clarithromycin" 8 32 FALSE "CLSI 2011" "MIC" "Cardiobacterium" 3 "Clarithromycin" 8 32 FALSE "CLSI 2011" "MIC" "Eikenella" 3 "Clarithromycin" 8 32 FALSE @@ -19452,31 +19857,19 @@ "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Clarithromycin" 0.25 1 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" "15ug" 21 16 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Clarithromycin" 0.25 1 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Cefmetazole" "30ug" 33 27 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Cefmetazole" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE "CLSI 2011" "MIC" "Acinetobacter" 3 "Colistin" 2 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefpodoxime" "10ug" 21 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefpodoxime" 2 2048 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Cefpodoxime" "10ug" 29 6 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Cefpodoxime" 0.5 2048 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefpodoxime" 0.5 2 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefprozil" "30ug" 18 14 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefprozil" 8 32 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefprozil" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE "CLSI 2011" "DISK" "Pseudomonas aeruginosa" 2 "Carbenicillin" "100ug" 17 13 FALSE "CLSI 2011" "MIC" "Pseudomonas aeruginosa" 2 "Carbenicillin" 128 512 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Carbenicillin" "Generic rules" "100ug" 23 19 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Carbenicillin" "Generic rules" "100ug" 16 64 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Ceftriaxone" "30ug" 23 19 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Ceftriaxone" 1 4 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Ceftriaxone" 2 2048 FALSE @@ -19503,16 +19896,11 @@ "CLSI 2011" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Ceftriaxone" 1 4 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" "30ug" 27 24 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ceftriaxone" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Ceftriaxone" 1 4 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Ceftibuten" "30ug" 28 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Ceftibuten" 2 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Cefotetan" "30ug" 26 19 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Cefotetan" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Cefotaxime" "30ug" 26 22 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Cefotaxime" 1 4 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Cefotaxime" 2 2048 FALSE @@ -19537,13 +19925,10 @@ "CLSI 2011" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefotaxime" 1 4 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" "30ug" 28 25 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefotaxime" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Cefotaxime" 1 4 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefuroxime axetil" "30ug" 20 16 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefuroxime axetil" 4 16 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Cefuroxime axetil" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Cefuroxime" "30ug" 18 14 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Cefuroxime" 8 32 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Cefuroxime" "30ug" 20 16 FALSE @@ -19555,37 +19940,24 @@ "CLSI 2011" "MIC" "Plesiomonas" 3 "Cefuroxime" 8 32 FALSE "CLSI 2011" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Cefuroxime" 1 4 FALSE "CLSI 2011" "MIC" "Parenteral" "Streptococcus pneumoniae" 2 "Cefuroxime" 0.5 2 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Cefazolin" 1 4 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Cefazolin" 8 16 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Cefazolin" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 2 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Ceftizoxime" "30ug" 26 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Ceftizoxime" 2 2048 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Ceftizoxime" "30ug" 38 6 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Ceftizoxime" 0.5 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE "CLSI 2011" "DISK" "Enterococcus" 3 "Daptomycin" "30ug" 11 6 FALSE "CLSI 2011" "MIC" "Enterococcus" 3 "Daptomycin" 4 2048 FALSE "CLSI 2011" "MIC" "Lactobacillus" 3 "Daptomycin" 4 2048 FALSE "CLSI 2011" "DISK" "Streptococcus" 3 "Daptomycin" "30ug" 16 6 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Daptomycin" 1 2048 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE "CLSI 2011" "DISK" "Streptococcus" 3 "Dirithromycin" "15ug" 18 13 FALSE "CLSI 2011" "MIC" "Streptococcus" 3 "Dirithromycin" 0.5 2 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Dirithromycin" "15ug" 18 13 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Dirithromycin" 0.5 2 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" "15ug" 18 13 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Dirithromycin" 0.5 2 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Doripenem" "Generic rules" "10ug" 1 4 FALSE "CLSI 2011" "DISK" "Acinetobacter" 3 "Doxycycline" "30ug" 13 9 FALSE "CLSI 2011" "MIC" "Bacillus anthracis" 2 "Doxycycline" 1 2048 FALSE "CLSI 2011" "MIC" "Brucella" 3 "Doxycycline" 1 2048 FALSE @@ -19593,24 +19965,18 @@ "CLSI 2011" "MIC" "Burkholderia pseudomallei" 2 "Doxycycline" 4 16 FALSE "CLSI 2011" "MIC" "Campylobacter" 3 "Doxycycline" 2 8 FALSE "CLSI 2011" "DISK" "Enterococcus" 3 "Doxycycline" "30ug" 16 12 FALSE -"CLSI 2011" "MIC" "Francisella tularensis tularensis" 1 "Doxycycline" 4 2048 FALSE +"CLSI 2011" "MIC" "Francisella tularensis" 2 "Doxycycline" 4 2048 FALSE "CLSI 2011" "DISK" "Pasteurella" 3 "Doxycycline" "30ug" 23 6 FALSE "CLSI 2011" "MIC" "Pasteurella" 3 "Doxycycline" 0.5 2048 FALSE "CLSI 2011" "DISK" "Staphylococcus" 3 "Doxycycline" "30ug" 16 12 FALSE "CLSI 2011" "MIC" "Vibrio cholerae" 2 "Doxycycline" "30ug" 4 16 FALSE "CLSI 2011" "MIC" "Yersinia pestis" 2 "Doxycycline" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE "CLSI 2011" "DISK" "Histophilus somni" 2 "Enrofloxacin" "5ug" 21 16 FALSE "CLSI 2011" "MIC" "Histophilus somni" 2 "Enrofloxacin" 0.25 2 FALSE "CLSI 2011" "DISK" "Providencia heimbachae" 2 "Enrofloxacin" "5ug" 21 16 FALSE -"CLSI 2011" "DISK" "Pasteurella multocida multocida" 1 "Enrofloxacin" "5ug" 21 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE +"CLSI 2011" "DISK" "Pasteurella multocida" 2 "Enrofloxacin" "5ug" 21 16 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Enoxacin" "10ug" 36 31 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Enoxacin" 0.5 2 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Erythromycin" 0.5 8 FALSE "CLSI 2011" "MIC" "Campylobacter" 3 "Erythromycin" 8 32 FALSE "CLSI 2011" "MIC" "Erysipelothrix rhusiopathiae" 2 "Erythromycin" "M45 Table 6" 0.25 1 FALSE @@ -19626,8 +19992,7 @@ "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Erythromycin" 0.25 1 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" "15ug" 21 15 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Erythromycin" 0.25 1 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Erythromycin" 0.25 1 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Ertapenem" "10ug" 19 15 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Ertapenem" 2 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Ertapenem" "10ug" 19 6 FALSE @@ -19637,9 +20002,6 @@ "CLSI 2011" "MIC" "Streptococcus" 3 "Ertapenem" 1 2048 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Ertapenem" 1 4 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ertapenem" 1 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 0.25 1 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE "CLSI 2011" "MIC" "Abiotrophia" 3 "Cefepime" "M45 Table 1" 1 4 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Cefepime" "30ug" 18 14 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Cefepime" 8 32 FALSE @@ -19657,20 +20019,11 @@ "CLSI 2011" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Cefepime" 1 4 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" "30ug" 24 21 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Cefepime" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 8 32 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Cefepime" 1 4 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Fleroxacin" "5ug" 19 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Fleroxacin" 2 2048 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Fleroxacin" "5ug" 35 28 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Fleroxacin" 0.25 1 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Cefoxitin" "30ug" 18 14 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Cefoxitin" 8 32 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Cefoxitin" "30ug" 28 23 FALSE @@ -19678,12 +20031,10 @@ "CLSI 2011" "DISK" "Plesiomonas" 3 "Cefoxitin" "30ug" 18 14 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Cefoxitin" 8 32 FALSE "CLSI 2011" "DISK" "Staphylococcus" 3 "Cefoxitin" "30ug" 25 24 FALSE -"CLSI 2011" "DISK" "Staphylococcus aureus aureus" 1 "Cefoxitin" "30ug" 22 21 FALSE -"CLSI 2011" "MIC" "Staphylococcus aureus aureus" 1 "Cefoxitin" 4 8 FALSE +"CLSI 2011" "DISK" "Staphylococcus aureus" 2 "Cefoxitin" "30ug" 22 21 FALSE +"CLSI 2011" "MIC" "Staphylococcus aureus" 2 "Cefoxitin" 4 8 FALSE "CLSI 2011" "DISK" "Staphylococcus lugdunensis" 2 "Cefoxitin" "30ug" 22 21 FALSE "CLSI 2011" "MIC" "Staphylococcus lugdunensis" 2 "Cefoxitin" 4 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE "CLSI 2011" "MIC" "Abiotrophia" 3 "Gatifloxacin" "M45 Table 1" 1 4 FALSE "CLSI 2011" "MIC" "Erysipelothrix rhusiopathiae" 2 "Gatifloxacin" "M45 Table 6" 1 2048 FALSE "CLSI 2011" "MIC" "Granulicatella" 3 "Gatifloxacin" 1 4 FALSE @@ -19699,29 +20050,22 @@ "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Gatifloxacin" 1 4 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" "5ug" 21 17 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Gatifloxacin" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Gatifloxacin" 1 4 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Gemifloxacin" "5ug" 18 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Gemifloxacin" 0.125 2048 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Gemifloxacin" "5ug" 23 19 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Gemifloxacin" 0.125 0.5 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Gentamicin" "10ug" 15 12 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Gentamicin" 4 16 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Gentamicin" 4 16 FALSE "CLSI 2011" "MIC" "Brucella" 3 "Gentamicin" 4 2048 FALSE -"CLSI 2011" "MIC" "Francisella tularensis tularensis" 1 "Gentamicin" 4 2048 FALSE +"CLSI 2011" "MIC" "Francisella tularensis" 2 "Gentamicin" 4 2048 FALSE "CLSI 2011" "MIC" "Leuconostoc" 3 "Gentamicin" 4 16 FALSE "CLSI 2011" "MIC" "Lactobacillus" 3 "Gentamicin" 4 16 FALSE "CLSI 2011" "MIC" "Pediococcus" 3 "Gentamicin" 4 16 FALSE "CLSI 2011" "DISK" "Plesiomonas" 3 "Gentamicin" "10ug" 15 12 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Gentamicin" 4 16 FALSE "CLSI 2011" "MIC" "Yersinia pestis" 2 "Gentamicin" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Grepafloxacin" "5ug" 24 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Grepafloxacin" 0.5 2048 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Grepafloxacin" "5ug" 37 27 FALSE @@ -19732,8 +20076,6 @@ "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Grepafloxacin" 0.5 2 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" "5ug" 19 15 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Grepafloxacin" 0.5 2 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2011" "MIC" "Abiotrophia" 3 "Imipenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Imipenem" "10ug" 16 13 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Imipenem" 4 16 FALSE @@ -19753,10 +20095,7 @@ "CLSI 2011" "DISK" "Plesiomonas" 3 "Imipenem" "10ug" 16 13 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Imipenem" 4 16 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Imipenem" 0.125 1 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Imipenem" 0.5 2 FALSE "CLSI 2011" "DISK" "Enterococcus" 3 "Linezolid" "30ug" 23 20 FALSE "CLSI 2011" "MIC" "Enterococcus" 3 "Linezolid" 2 8 FALSE "CLSI 2011" "MIC" "Lactobacillus" 3 "Linezolid" 4 2048 FALSE @@ -19766,21 +20105,13 @@ "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Linezolid" 2 2048 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" "30ug" 21 6 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Linezolid" 2 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Lomefloxacin" "10ug" 22 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Lomefloxacin" 2 2048 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Lomefloxacin" "10ug" 38 26 FALSE "CLSI 2011" "MIC" "Neisseria gonorrhoeae" 2 "Lomefloxacin" 0.125 2 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Loracarbef" "30ug" 19 15 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Loracarbef" 8 32 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Loracarbef" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE "CLSI 2011" "MIC" "Abiotrophia" 3 "Levofloxacin" "M45 Table 1" 2 8 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Levofloxacin" "5ug" 17 13 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Levofloxacin" 2 8 FALSE @@ -19790,7 +20121,7 @@ "CLSI 2011" "MIC" "Cardiobacterium" 3 "Levofloxacin" 2 8 FALSE "CLSI 2011" "MIC" "Eikenella" 3 "Levofloxacin" 2 8 FALSE "CLSI 2011" "MIC" "Erysipelothrix rhusiopathiae" 2 "Levofloxacin" "M45 Table 6" 2 2048 FALSE -"CLSI 2011" "MIC" "Francisella tularensis tularensis" 1 "Levofloxacin" 0.5 2048 FALSE +"CLSI 2011" "MIC" "Francisella tularensis" 2 "Levofloxacin" 0.5 2048 FALSE "CLSI 2011" "MIC" "Granulicatella" 3 "Levofloxacin" 2 8 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Levofloxacin" "5ug" 17 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Levofloxacin" 2 2048 FALSE @@ -19810,13 +20141,8 @@ "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" "5ug" 17 13 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Levofloxacin" 2 8 FALSE "CLSI 2011" "MIC" "Yersinia pestis" 2 "Levofloxacin" 0.25 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Levofloxacin" 2 8 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Cefamandole" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE "CLSI 2011" "MIC" "Abiotrophia" 3 "Meropenem" "M45 Table 1" 0.5 2 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Meropenem" "10ug" 16 13 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Meropenem" 4 16 FALSE @@ -19837,14 +20163,9 @@ "CLSI 2011" "MIC" "Streptococcus" 3 "Meropenem" 0.5 2048 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Meropenem" 0.25 1 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Meropenem" 0.5 2048 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 23 19 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Meropenem" 0.5 2 FALSE "CLSI 2011" "DISK" "Pseudomonas aeruginosa" 2 "Mezlocillin" "75ug" 16 15 FALSE "CLSI 2011" "MIC" "Pseudomonas aeruginosa" 2 "Mezlocillin" 64 128 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Mezlocillin" "Generic rules" "75ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Mezlocillin" "Generic rules" "75ug" 16 128 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Moxifloxacin" "5ug" 18 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Moxifloxacin" 1 2048 FALSE "CLSI 2011" "DISK" "Pasteurella" 3 "Moxifloxacin" "5ug" 28 6 FALSE @@ -19852,8 +20173,6 @@ "CLSI 2011" "DISK" "Staphylococcus" 3 "Moxifloxacin" "5ug" 24 20 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Moxifloxacin" "5ug" 18 14 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Moxifloxacin" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2011" "DISK" "Burkholderia cepacia" 2 "Minocycline" "30ug" 19 14 FALSE "CLSI 2011" "DISK" "Enterococcus" 3 "Minocycline" "30ug" 19 14 FALSE "CLSI 2011" "MIC" "Leuconostoc" 3 "Minocycline" 4 16 FALSE @@ -19861,20 +20180,8 @@ "CLSI 2011" "MIC" "Neisseria meningitidis" 2 "Minocycline" 2 2048 FALSE "CLSI 2011" "DISK" "Stenotrophomonas maltophilia" 2 "Minocycline" "30ug" 19 14 FALSE "CLSI 2011" "DISK" "Staphylococcus" 3 "Minocycline" "30ug" 19 14 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE "CLSI 2011" "DISK" "Neisseria meningitidis" 2 "Nalidixic acid" "30ug" 26 25 FALSE "CLSI 2011" "MIC" "Neisseria meningitidis" 2 "Nalidixic acid" 4 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Ofloxacin" "5ug" 16 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Ofloxacin" 2 2048 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Ofloxacin" "5ug" 31 24 FALSE @@ -19887,15 +20194,10 @@ "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Ofloxacin" 2 8 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" "5ug" 16 12 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Ofloxacin" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE -"CLSI 2011" "DISK" "Staphylococcus aureus aureus" 1 "Oxacillin" "1ug" 13 10 FALSE -"CLSI 2011" "MIC" "Staphylococcus aureus aureus" 1 "Oxacillin" 2 4 FALSE +"CLSI 2011" "DISK" "Staphylococcus aureus" 2 "Oxacillin" "1ug" 13 10 FALSE +"CLSI 2011" "MIC" "Staphylococcus aureus" 2 "Oxacillin" 2 4 FALSE "CLSI 2011" "MIC" "Staphylococcus lugdunensis" 2 "Oxacillin" 2 4 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Oxacillin" "1ug" 20 6 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE "CLSI 2011" "MIC" "Abiotrophia" 3 "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Benzylpenicillin" 1 4 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Benzylpenicillin" 0.125 0.25 FALSE @@ -19922,28 +20224,17 @@ "CLSI 2011" "MIC" "Non-meningitis" "Streptococcus pneumoniae" 2 "Benzylpenicillin" 2 8 FALSE "CLSI 2011" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Benzylpenicillin" 0.064 2 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Benzylpenicillin" 0.125 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Benzylpenicillin" 0.125 4 FALSE "CLSI 2011" "MIC" "Oral" "Streptococcus pneumoniae" 2 "Phenoxymethylpenicillin" 0.064 2 FALSE "CLSI 2011" "DISK" "Pseudomonas aeruginosa" 2 "Piperacillin" "100ug" 18 17 FALSE "CLSI 2011" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin" 64 128 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE "CLSI 2011" "MIC" "Acinetobacter" 3 "Polymyxin B" 2 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE "CLSI 2011" "DISK" "Streptococcus" 3 "Quinupristin/dalfopristin" "15ug" 19 15 FALSE "CLSI 2011" "MIC" "Streptococcus" 3 "Quinupristin/dalfopristin" 1 4 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" "15ug" 19 15 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Quinupristin/dalfopristin" 1 4 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" "15ug" 19 15 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Quinupristin/dalfopristin" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Rifampicin" 1 4 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Rifampicin" 1 4 FALSE "CLSI 2011" "MIC" "Cardiobacterium" 3 "Rifampicin" 1 4 FALSE @@ -19955,8 +20246,6 @@ "CLSI 2011" "MIC" "Neisseria meningitidis" 2 "Rifampicin" 0.5 2 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Rifampicin" "5ug" 19 16 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Rifampicin" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Ampicillin/sulbactam" "10ug" 15 11 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Ampicillin/sulbactam" 8 32 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Ampicillin/sulbactam" 2 4 FALSE @@ -19966,33 +20255,18 @@ "CLSI 2011" "MIC" "Haemophilus" 3 "Ampicillin/sulbactam" 2 4 FALSE "CLSI 2011" "DISK" "Plesiomonas" 3 "Ampicillin/sulbactam" "10ug" 15 11 FALSE "CLSI 2011" "MIC" "Plesiomonas" 3 "Ampicillin/sulbactam" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2011" "MIC" "Neisseria meningitidis" 2 "Sulfamethoxazole" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2011" "MIC" "Neisseria meningitidis" 2 "Sulfisoxazole" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE "CLSI 2011" "DISK" "Histophilus somni" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2011" "DISK" "Providencia heimbachae" 2 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2011" "DISK" "Pasteurella multocida multocida" 1 "Spectinomycin" "100ug" 14 10 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Spectinomycin" "Generic rules" "100ug" 18 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Spectinomycin" "Generic rules" "100ug" 32 128 FALSE +"CLSI 2011" "DISK" "Pasteurella multocida" 2 "Spectinomycin" "100ug" 14 10 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Sparfloxacin" 0.25 2048 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Sparfloxacin" "5ug" 19 15 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Sparfloxacin" 0.5 2 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE "CLSI 2011" "MIC" "Neisseria meningitidis" 2 "Sulfonamide" 2 8 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE "CLSI 2011" "MIC" "Brucella" 3 "Streptoduocin" 8 2048 FALSE -"CLSI 2011" "MIC" "Francisella tularensis tularensis" 1 "Streptoduocin" 8 2048 FALSE +"CLSI 2011" "MIC" "Francisella tularensis" 2 "Streptoduocin" 8 2048 FALSE "CLSI 2011" "MIC" "Yersinia pestis" 2 "Streptoduocin" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 16 10 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Trimethoprim/sulfamethoxazole" 2 4 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Trimethoprim/sulfamethoxazole" 0.5 4 FALSE @@ -20015,14 +20289,10 @@ "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" "1.25ug/23.75ug" 19 15 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Trimethoprim/sulfamethoxazole" 0.5 4 FALSE "CLSI 2011" "MIC" "Yersinia pestis" 2 "Trimethoprim/sulfamethoxazole" 2 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE "CLSI 2011" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" "75/10ug" 15 14 FALSE "CLSI 2011" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin/clavulanic acid" 64 128 FALSE "CLSI 2011" "DISK" "Staphylococcus" 3 "Ticarcillin/clavulanic acid" "75/10ug" 23 22 FALSE "CLSI 2011" "MIC" "Staphylococcus" 3 "Ticarcillin/clavulanic acid" 8 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE "CLSI 2011" "DISK" "Aeromonas" 3 "Tetracycline" "30ug" 15 11 FALSE "CLSI 2011" "MIC" "Aeromonas" 3 "Tetracycline" 4 16 FALSE "CLSI 2011" "MIC" "Aggregatibacter" 3 "Tetracycline" 2 8 FALSE @@ -20035,7 +20305,7 @@ "CLSI 2011" "MIC" "Cardiobacterium" 3 "Tetracycline" 2 8 FALSE "CLSI 2011" "MIC" "Eikenella" 3 "Tetracycline" 2 8 FALSE "CLSI 2011" "DISK" "Enterococcus" 3 "Tetracycline" "30ug" 19 14 FALSE -"CLSI 2011" "MIC" "Francisella tularensis tularensis" 1 "Tetracycline" 4 2048 FALSE +"CLSI 2011" "MIC" "Francisella tularensis" 2 "Tetracycline" 4 2048 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Tetracycline" "30ug" 29 25 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Tetracycline" 2 8 FALSE "CLSI 2011" "MIC" "Kingella" 3 "Tetracycline" 2 8 FALSE @@ -20055,34 +20325,16 @@ "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" "30ug" 23 18 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Tetracycline" 2 8 FALSE "CLSI 2011" "MIC" "Yersinia pestis" 2 "Tetracycline" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE "CLSI 2011" "DISK" "Pseudomonas aeruginosa" 2 "Ticarcillin" "75ug" 15 14 FALSE "CLSI 2011" "MIC" "Pseudomonas aeruginosa" 2 "Ticarcillin" 64 128 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ticarcillin" "Generic rules" "75ug" 20 14 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ticarcillin" "Generic rules" "75ug" 16 128 FALSE "CLSI 2011" "DISK" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" "15ug" 11 10 FALSE "CLSI 2011" "MIC" "Actinobacillus pleuropneumoniae" 2 "Tilmicosin" 16 32 FALSE -"CLSI 2011" "DISK" "Pasteurella multocida multocida" 1 "Tilmicosin" "15ug" 11 10 FALSE -"CLSI 2011" "MIC" "Pasteurella multocida multocida" 1 "Tilmicosin" 16 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE +"CLSI 2011" "DISK" "Pasteurella multocida" 2 "Tilmicosin" "15ug" 11 10 FALSE +"CLSI 2011" "MIC" "Pasteurella multocida" 2 "Tilmicosin" 16 32 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Telithromycin" "15ug" 15 11 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Telithromycin" 4 16 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Telithromycin" "15ug" 19 15 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Telithromycin" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE "CLSI 2011" "DISK" "Haemophilus" 3 "Trovafloxacin" "10ug" 22 6 FALSE "CLSI 2011" "MIC" "Haemophilus" 3 "Trovafloxacin" 1 2048 FALSE "CLSI 2011" "DISK" "Neisseria gonorrhoeae" 2 "Trovafloxacin" "10ug" 34 6 FALSE @@ -20103,217 +20355,16 @@ "CLSI 2011" "MIC" "Pseudomonas aeruginosa" 2 "Piperacillin/tazobactam" 64 128 FALSE "CLSI 2011" "DISK" "Staphylococcus" 3 "Piperacillin/tazobactam" "100/10ug" 18 17 FALSE "CLSI 2011" "MIC" "Staphylococcus" 3 "Piperacillin/tazobactam" 8 16 FALSE -"CLSI 2011" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE "CLSI 2011" "MIC" "Abiotrophia" 3 "Vancomycin" "M45 Table 1" 1 2048 FALSE "CLSI 2011" "MIC" "Bacillus" 3 "Vancomycin" 4 2048 FALSE "CLSI 2011" "DISK" "Enterococcus" 3 "Vancomycin" "30ug" 17 14 FALSE "CLSI 2011" "MIC" "Granulicatella" 3 "Vancomycin" 1 2048 FALSE "CLSI 2011" "MIC" "Lactobacillus" 3 "Vancomycin" 2 16 FALSE -"CLSI 2011" "MIC" "Staphylococcus aureus aureus" 1 "Vancomycin" 2 16 FALSE +"CLSI 2011" "MIC" "Staphylococcus aureus" 2 "Vancomycin" 2 16 FALSE "CLSI 2011" "DISK" "Streptococcus" 3 "Vancomycin" "30ug" 17 6 FALSE "CLSI 2011" "MIC" "Streptococcus" 3 "Vancomycin" 1 2048 FALSE "CLSI 2011" "DISK" "Streptococcus pneumoniae" 2 "Vancomycin" "30ug" 17 6 FALSE "CLSI 2011" "MIC" "Streptococcus pneumoniae" 2 "Vancomycin" 1 2048 FALSE "CLSI 2011" "DISK" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" "30ug" 17 6 FALSE "CLSI 2011" "MIC" "Viridans Group Streptococcus (VGS)" 2 "Vancomycin" 1 2048 FALSE -"CLSI 2011" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 18 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Amoxicillin/clavulanic acid" "Generic rules" "20/10ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 17 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Amikacin" "Generic rules" "30ug" 16 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ampicillin" "Generic rules" "10ug" 17 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ampicillin" "Generic rules" "2ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Aztreonam" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 18 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Azlocillin" "Generic rules" "75ug" 64 128 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Azithromycin" "Generic rules" "15ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefetamet" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ceftazidime" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefdinir" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefaclor" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cephalothin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefixime" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 21 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefoperazone" "Generic rules" "75ug" 16 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 18 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Chloramphenicol" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefonicid" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 19 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cinoxacin" "Generic rules" "100ug" 16 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 21 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ciprofloxacin" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 21 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Clindamycin" "Generic rules" "2ug" 0.5 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 18 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Clarithromycin" "Generic rules" "15ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefmetazole" "Generic rules" "30ug" 16 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 11 10 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Colistin" "Generic rules" "10ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefpodoxime" "Generic rules" "10ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefprozil" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Carbenicillin" "Generic rules" "100ug" 23 19 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Carbenicillin" "Generic rules" "100ug" 16 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 23 19 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ceftriaxone" "Generic rules" "30ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ceftibuten" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefotetan" "Generic rules" "30ug" 16 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 26 22 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefotaxime" "Generic rules" "30ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefuroxime axetil" "Generic rules" "30ug" 4 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefuroxime" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefazolin" "Generic rules" "30ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 25 21 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ceftizoxime" "Generic rules" "30ug" 1 4 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Daptomycin" "Generic rules" "30ug" 1 2048 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Difloxacin" "Generic rules" "10ug" 0.5 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Dirithromycin" "Generic rules" "15ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Doxycycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 23 16 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Enrofloxacin" "Generic rules" "5ug" 0.25 2 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Enoxacin" "Generic rules" "10ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 23 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Erythromycin" "Generic rules" "15ug" 0.5 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 19 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ertapenem" "Generic rules" "10ug" 2 8 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "5-fluorocytosine" "Generic rules" "10ug" 4 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefepime" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Fleroxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 19 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Florfenicol" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 19 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Fluconazole" "Generic rules" "25ug" 8 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 16 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Fosfomycin" "Generic rules" "200ug" 64 256 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefoxitin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Gatifloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 10 6 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Gentamicin-high" "Generic rules" "120ug" 512 560 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 20 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Gemifloxacin" "Generic rules" "5ug" 0.25 1 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Gentamicin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Grepafloxacin" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 16 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Imipenem" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 18 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Kanamycin" "Generic rules" "30ug" 16 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 21 20 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Linezolid" "Generic rules" "30ug" 4 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 22 18 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Lomefloxacin" "Generic rules" "10ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Loracarbef" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 23 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Latamoxef" "Generic rules" "30ug" 8 64 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 17 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Levofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Cefamandole" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Mecillinam" "Generic rules" "10ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 16 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Meropenem" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 14 9 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Methicillin" "Generic rules" "5ug" 8 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Mezlocillin" "Generic rules" "75ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Mezlocillin" "Generic rules" "75ug" 16 128 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 24 20 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Moxifloxacin" "Generic rules" "5ug" 0.5 2 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 16 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Minocycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 13 10 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Nafcillin" "Generic rules" "1ug" 2 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 19 13 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Nalidixic acid" "Generic rules" "30ug" 16 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 15 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Netilmicin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "300ug" 17 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Nitrofurantoin" "Generic rules" "100ug" 32 128 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 17 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Norfloxacin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 16 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ofloxacin" "Generic rules" "5ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 23 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Orbifloxacin" "Generic rules" "10ug" 1 8 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Oxacillin" "Generic rules" "1ug" 0.25 0.5 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 29 28 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Benzylpenicillin" "Generic rules" "10units" 0.125 0.25 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Piperacillin" "Generic rules" "100ug" 16 128 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 12 11 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Polymyxin B" "Generic rules" "300units" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Penicillin/novobiocin" "Generic rules" "10units/30ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 13 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Pirlimycin" "Generic rules" "2ug" 2 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 19 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Quinupristin/dalfopristin" "Generic rules" "15ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 20 16 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Rifampicin" "Generic rules" "5ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 15 11 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ampicillin/sulbactam" "Generic rules" "10/10ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Sulfadiazine" "Generic rules" "200-300ug" 256 512 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Sulfamethoxazole" "Generic rules" "200-300ug" 256 512 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 17 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Sulfisoxazole" "Generic rules" "200-300ug" 256 512 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Spectinomycin" "Generic rules" "100ug" 18 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Spectinomycin" "Generic rules" "100ug" 32 128 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 19 15 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Sparfloxacin" "Generic rules" "5ug" 0.5 2 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 10 6 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Streptomycin-high" "Generic rules" "300ug" 1024 2048 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Streptomycin" "Generic rules" "10ug" 15 11 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 16 10 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Trimethoprim/sulfamethoxazole" "Generic rules" "1.25/23.75ug" 2 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 20 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ticarcillin/clavulanic acid" "Generic rules" "75/10-15ug" 16 128 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 15 11 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Tetracycline" "Generic rules" "30ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 14 10 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Teicoplanin" "Generic rules" "30ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 9 8 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Tiamulin" "Generic rules" "30ug" 16 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ticarcillin" "Generic rules" "75ug" 20 14 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ticarcillin" "Generic rules" "75ug" 16 128 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 14 10 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Tilmicosin" "Generic rules" "15ug" 8 32 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Ceftiofur" "Generic rules" "30ug" 2 8 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 22 18 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Telithromycin" "Generic rules" "15ug" 1 4 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 16 10 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Trimethoprim" "Generic rules" "5ug" 8 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 15 12 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Tobramycin" "Generic rules" "10ug" 4 16 FALSE -"CLSI 2010" "DISK" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 21 17 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Piperacillin/tazobactam" "Generic rules" "100/10ug" 16 128 FALSE -"CLSI 2010" "MIC" "(unknown name)" 6 "Vancomycin" "Generic rules" "30ug" 4 32 FALSE +"CLSI 2011" "MIC" "(unknown name)" 6 "Vancomycin" 1 2048 FALSE diff --git a/data-raw/rsi_translation.xlsx b/data-raw/rsi_translation.xlsx index cbe301f4..c252f771 100644 Binary files a/data-raw/rsi_translation.xlsx and b/data-raw/rsi_translation.xlsx differ diff --git a/data/rsi_translation.rda b/data/rsi_translation.rda index 472c4ff0..acbbf9a4 100644 Binary files a/data/rsi_translation.rda and b/data/rsi_translation.rda differ diff --git a/docs/404.html b/docs/404.html index bc5b0f4c..04e47e6d 100644 --- a/docs/404.html +++ b/docs/404.html @@ -43,7 +43,7 @@ AMR (for R) - 1.8.1.9005 + 1.8.1.9006 diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html index 02bfcf98..c814dca7 100644 --- a/docs/LICENSE-text.html +++ b/docs/LICENSE-text.html @@ -17,7 +17,7 @@ AMR (for R) - 1.8.1.9005 + 1.8.1.9006 diff --git a/docs/articles/datasets.html b/docs/articles/datasets.html index f992dd58..0a4e2c5c 100644 --- a/docs/articles/datasets.html +++ b/docs/articles/datasets.html @@ -44,7 +44,7 @@ AMR (for R) - 1.8.1.9005 + 1.8.1.9006 @@ -1168,12 +1168,12 @@ column names:
guideline, method, site, mo breakpoint_S, breakpoint_R and uti.

This data set is in R available as rsi_translation, after you load the AMR package.

-

It was last updated on 10 May 2022 13:51:53 UTC. Find more info about +

It was last updated on 10 May 2022 19:28:23 UTC. Find more info about the structure of this data set here.

Direct download links: