diff --git a/NEWS.md b/NEWS.md index 376d00ba4..9f953dcca 100755 --- a/NEWS.md +++ b/NEWS.md @@ -73,7 +73,7 @@ The `antibiotics` data set was greatly updated: * Updated DDDs and PubChem Compound IDs * Updated some antibiotic name spelling, now used by WHOCC (such as cephalexin -> cefalexin, and phenethicillin -> pheneticillin) * Antibiotic code "CEI" for ceftolozane/tazobactam has been replaced with "CZT" to comply with EARS-Net and WHONET 2022. The old code will still work in all cases when using `as.ab()` or any of the `ab_*()` functions. - * Support for antimicrobial interpretation of anaerobic bacteria, by adding a 'placeholder' code `B_ANAER` to the `microorganisms` data set and adding the breakpoints of anaerobics to the `sir_interpretation` data set, which is used by `as.sir()` for interpretion of MIC and disk diffusion values + * Support for antimicrobial interpretation of anaerobic bacteria, by adding a 'placeholder' code `B_ANAER` to the `microorganisms` data set and adding the breakpoints of anaerobics to the `clinical_breakpoints` data set, which is used by `as.sir()` for interpretion of MIC and disk diffusion values Also, we added support for using antibiotic selectors in scoped `dplyr` verbs (with or without using `vars()`), such as in: `... %>% summarise_at(aminoglycosides(), resistance)`, please see `resistance()` for examples. diff --git a/R/aa_helper_functions.R b/R/aa_helper_functions.R index 0598138cd..1d13bfbdb 100755 --- a/R/aa_helper_functions.R +++ b/R/aa_helper_functions.R @@ -667,7 +667,7 @@ vector_or <- function(v, quotes = TRUE, reverse = FALSE, sort = TRUE, initial_ca } if (identical(v, c("I", "R", "S"))) { # class 'sir' should be sorted like this - v <- c("R", "S", "I") + v <- c("S", "I", "R") } # all commas except for last item, so will become '"val1", "val2", "val3" or "val4"' paste0( diff --git a/R/ab_selectors.R b/R/ab_selectors.R index 97fe30f15..ffcacd783 100755 --- a/R/ab_selectors.R +++ b/R/ab_selectors.R @@ -639,10 +639,10 @@ c.ab_selector <- function(...) { all_any_ab_selector <- function(type, ..., na.rm = TRUE) { cols_ab <- c(...) - result <- cols_ab[toupper(cols_ab) %in% c("R", "S", "I")] + result <- cols_ab[toupper(cols_ab) %in% c("S", "I", "R")] if (length(result) == 0) { - message_("Filtering ", type, " of columns ", vector_and(font_bold(cols_ab, collapse = NULL), quotes = "'"), ' to contain value "R", "S" or "I"') - result <- c("R", "S", "I") + message_("Filtering ", type, " of columns ", vector_and(font_bold(cols_ab, collapse = NULL), quotes = "'"), ' to contain value "S", "I" or "R"') + result <- c("S", "I", "R") } cols_ab <- cols_ab[!cols_ab %in% result] df <- get_current_data(arg_name = NA, call = -3) @@ -751,8 +751,8 @@ any.ab_selector_any_all <- function(..., na.rm = FALSE) { } } # this is `!=`, so turn around the values - rsi <- c("R", "S", "I") - e2 <- rsi[rsi != e2] + sir <- c("S", "I", "R") + e2 <- sir[sir != e2] structure(all_any_ab_selector(type = type, e1, e2), class = c("ab_selector_any_all", "logical") ) diff --git a/R/custom_eucast_rules.R b/R/custom_eucast_rules.R index 802ec2e00..f77a76d0d 100755 --- a/R/custom_eucast_rules.R +++ b/R/custom_eucast_rules.R @@ -181,8 +181,8 @@ custom_eucast_rules <- function(...) { result_value <- as.character(result)[[3]] result_value[result_value == "NA"] <- NA stop_ifnot( - result_value %in% c("R", "S", "I", NA), - "the resulting value of rule ", i, " must be either \"R\", \"S\", \"I\" or NA" + result_value %in% c("S", "I", "R", NA), + "the resulting value of rule ", i, " must be either \"S\", \"I\", \"R\" or NA" ) result_value <- as.sir(result_value) diff --git a/R/first_isolate.R b/R/first_isolate.R index f60de3593..06eaf8dff 100755 --- a/R/first_isolate.R +++ b/R/first_isolate.R @@ -237,7 +237,7 @@ first_isolate <- function(x = NULL, FUN.VALUE = logical(1), X = x, # check only first 10,000 rows - FUN = function(x) any(as.character(x[1:10000]) %in% c("R", "S", "I"), na.rm = TRUE), + FUN = function(x) any(as.character(x[1:10000]) %in% c("S", "I", "R"), na.rm = TRUE), USE.NAMES = FALSE )) if (method == "phenotype-based" && !any_col_contains_sir) { diff --git a/R/key_antimicrobials.R b/R/key_antimicrobials.R index 081bb3326..875c5e654 100755 --- a/R/key_antimicrobials.R +++ b/R/key_antimicrobials.R @@ -282,7 +282,7 @@ generate_antimcrobials_string <- function(df) { as.list(df), function(x) { x <- toupper(as.character(x)) - x[!x %in% c("R", "S", "I")] <- "." + x[!x %in% c("S", "I", "R")] <- "." paste(x) } ) @@ -308,7 +308,7 @@ antimicrobials_equal <- function(y, meet_criteria(points_threshold, allow_class = c("numeric", "integer"), has_length = 1, is_positive = TRUE, is_finite = TRUE) stop_ifnot(length(y) == length(z), "length of `y` and `z` must be equal") - key2rsi <- function(val) { + key2sir <- function(val) { val <- strsplit(val, "", fixed = TRUE)[[1L]] val.int <- rep(NA_real_, length(val)) val.int[val == "S"] <- 1 @@ -318,7 +318,7 @@ antimicrobials_equal <- function(y, } # only run on uniques uniq <- unique(c(y, z)) - uniq_list <- lapply(uniq, key2rsi) + uniq_list <- lapply(uniq, key2sir) names(uniq_list) <- uniq y <- uniq_list[match(y, names(uniq_list))] diff --git a/R/mean_amr_distance.R b/R/mean_amr_distance.R index 178cd728d..218e36da3 100755 --- a/R/mean_amr_distance.R +++ b/R/mean_amr_distance.R @@ -30,7 +30,7 @@ #' Calculate the Mean AMR Distance #' #' Calculates a normalised mean for antimicrobial resistance between multiple observations, to help to identify similar isolates without comparing antibiograms by hand. -#' @param x a vector of class [rsi][as.sir()], [mic][as.mic()] or [disk][as.disk()], or a [data.frame] containing columns of any of these classes +#' @param x a vector of class [sir][as.sir()], [mic][as.mic()] or [disk][as.disk()], or a [data.frame] containing columns of any of these classes #' @param ... variables to select (supports [tidyselect language][tidyselect::language] such as `column1:column4` and `where(is.mic)`, and can thus also be [antibiotic selectors][ab_selector()] #' @param combine_SI a [logical] to indicate whether all values of S and I must be merged into one, so the input only consists of S+I vs. R (susceptible vs. resistant), defaults to `TRUE` #' @details The mean AMR distance is effectively [the Z-score](https://en.wikipedia.org/wiki/Standard_score); a normalised numeric value to compare AMR test results which can help to identify similar isolates, without comparing antibiograms by hand. @@ -46,9 +46,9 @@ #' Isolates with distances less than 0.01 difference from each other should be considered similar. Differences lower than 0.025 should be considered suspicious. #' @export #' @examples -#' rsi <- random_sir(10) -#' rsi -#' mean_amr_distance(rsi) +#' sir <- random_sir(10) +#' sir +#' mean_amr_distance(sir) #' #' mic <- random_mic(10) #' mic diff --git a/R/proportion.R b/R/proportion.R index dbf792f86..410b0c302 100755 --- a/R/proportion.R +++ b/R/proportion.R @@ -40,7 +40,7 @@ #' @param translate_ab a column name of the [antibiotics] data set to translate the antibiotic abbreviations to, using [ab_property()] #' @inheritParams ab_property #' @param combine_SI a [logical] to indicate whether all values of S and I must be merged into one, so the output only consists of S+I vs. R (susceptible vs. resistant), defaults to `TRUE` -#' @param ab_result antibiotic results to test against, must be one of more values of "R", "S", "I" +#' @param ab_result antibiotic results to test against, must be one or more values of "S", "I", or "R" #' @param confidence_level the confidence level for the returned confidence interval. For the calculation, the number of S or SI isolates, and R isolates are compared with the total number of available isolates with R, S, or I by using [binom.test()], i.e., the Clopper-Pearson method. #' @param side the side of the confidence interval to return. Defaults to `"both"` for a length 2 vector, but can also be (abbreviated as) `"min"`/`"left"`/`"lower"`/`"less"` or `"max"`/`"right"`/`"higher"`/`"greater"`. #' @inheritSection as.sir Interpretation of SIR @@ -200,7 +200,7 @@ #' combination_n = count_all(CIP, GEN) #' ) #' -#' # Get proportions S/I/R immediately of all rsi columns +#' # Get proportions S/I/R immediately of all sir columns #' example_isolates %>% #' select(AMX, CIP) %>% #' proportion_df(translate = FALSE) @@ -256,7 +256,7 @@ sir_confidence_interval <- function(..., only_all_tested = FALSE, confidence_level = 0.95, side = "both") { - meet_criteria(ab_result, allow_class = c("character", "sir"), has_length = c(1, 2, 3), is_in = c("R", "S", "I")) + meet_criteria(ab_result, allow_class = c("character", "sir"), has_length = c(1, 2, 3), is_in = c("S", "I", "R")) meet_criteria(confidence_level, allow_class = "numeric", is_positive = TRUE, has_length = 1) meet_criteria(side, allow_class = "character", has_length = 1, is_in = c("both", "b", "left", "l", "lower", "lowest", "less", "min", "right", "r", "higher", "highest", "greater", "g", "max")) x <- tryCatch( diff --git a/R/sir.R b/R/sir.R index ca7520188..69dc8b390 100755 --- a/R/sir.R +++ b/R/sir.R @@ -27,7 +27,7 @@ # how to conduct AMR data analysis: https://msberends.github.io/AMR/ # # ==================================================================== # -#' Interpret MIC and Disk Values, or Clean Raw SIR Data +#' Translate MIC and Disk Diffusion to SIR, or Clean Existing SIR Data #' #' Interpret minimum inhibitory concentration (MIC) values and disk diffusion diameters according to EUCAST or CLSI, or clean up existing SIR values. This transforms the input to a new class [`sir`], which is an ordered [factor] with levels `S < I < R`. #' @rdname as.sir @@ -258,9 +258,9 @@ is_sir_eligible <- function(x, threshold = 0.05) { %in% class(x))) { # no transformation needed return(FALSE) - } else if (all(x %in% c("R", "S", "I", NA)) & !all(is.na(x))) { + } else if (all(x %in% c("S", "I", "R", NA)) & !all(is.na(x))) { return(TRUE) - } else if (!any(c("R", "S", "I") %in% x, na.rm = TRUE) & !all(is.na(x))) { + } else if (!any(c("S", "I", "R") %in% x, na.rm = TRUE) & !all(is.na(x))) { return(FALSE) } else { x <- x[!is.na(x) & !is.null(x) & !x %in% c("", "-", "NULL")] @@ -301,7 +301,7 @@ as.sir.default <- function(x, ...) { if (inherits(x.bak, c("integer", "numeric", "double")) && all(x %in% c(1:3, NA))) { # support haven package for importing e.g., from SPSS - it adds the 'labels' attribute lbls <- attributes(x.bak)$labels - if (!is.null(lbls) && all(c("R", "S", "I") %in% names(lbls)) && all(c(1:3) %in% lbls)) { + if (!is.null(lbls) && all(c("S", "I", "R") %in% names(lbls)) && all(c(1:3) %in% lbls)) { x[x.bak == 1] <- names(lbls[lbls == 1]) x[x.bak == 2] <- names(lbls[lbls == 2]) x[x.bak == 3] <- names(lbls[lbls == 3]) @@ -314,7 +314,7 @@ as.sir.default <- function(x, ...) { x[x.bak == "1"] <- "S" x[x.bak == "2"] <- "I" x[x.bak == "3"] <- "R" - } else if (!all(is.na(x)) && !identical(levels(x), c("R", "S", "I")) && !all(x %in% c("R", "S", "I", NA))) { + } else if (!all(is.na(x)) && !identical(levels(x), c("S", "I", "R")) && !all(x %in% c("S", "I", "R", NA))) { if (all(x %unlike% "(R|S|I)", na.rm = TRUE)) { # check if they are actually MICs or disks if (all_valid_mics(x)) { @@ -625,7 +625,7 @@ as.sir.data.frame <- function(x, show_message <- FALSE ab <- ab_cols[i] ab_coerced <- suppressWarnings(as.ab(ab)) - if (!all(x[, ab_cols[i], drop = TRUE] %in% c("R", "S", "I", NA), na.rm = TRUE)) { + if (!all(x[, ab_cols[i], drop = TRUE] %in% c("S", "I", "R", NA), na.rm = TRUE)) { show_message <- TRUE # only print message if values are not already clean message_("=> Cleaning values in column '", font_bold(ab), "' (", diff --git a/R/vctrs.R b/R/vctrs.R index 77ca889dc..9567dcd89 100755 --- a/R/vctrs.R +++ b/R/vctrs.R @@ -141,7 +141,7 @@ vec_math.mic <- function(.fn, x, ...) { .fn(as.double(x), ...) } -# S3: rsi +# S3: sir vec_ptype2.character.sir <- function(x, y, ...) { x } diff --git a/R/zzz.R b/R/zzz.R index e801a9d32..5fbd77984 100755 --- a/R/zzz.R +++ b/R/zzz.R @@ -166,7 +166,7 @@ if (utf8_supported && !is_latex) { s3_register("vctrs::vec_cast", "mic.character") s3_register("vctrs::vec_cast", "mic.double") s3_register("vctrs::vec_math", "mic") - # S3: rsi + # S3: sir s3_register("vctrs::vec_ptype2", "character.sir") s3_register("vctrs::vec_ptype2", "sir.character") s3_register("vctrs::vec_cast", "character.sir") diff --git a/data-raw/Loinc.csv b/data-raw/Loinc.csv index 5056f66ae..0964570e6 100644 --- a/data-raw/Loinc.csv +++ b/data-raw/Loinc.csv @@ -53952,7 +53952,7 @@ "58301-3","High blood pressure without toxemia during this pregnancy","Find","Pt","^Patient","Ord","","PHENX","2.65","MIN","","TRIAL","","2","","","Did you have High blood pressure without toxemia during this pregnancy?","PX040401020000","N","BP; Finding; Findings; Gestation; Gestations; Gravida; High BP WO toxemia during pregnancy; Ordinal; PhenX; Point in time; Pregnancies; QL; Qual; Qualitative; Random; Screen","High BP WO toxemia during pregnancy","","","","","High blood pressure without toxemia during this pregnancy","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.","0","0","0","","","","","","2.30","","" "58302-1","Ever told by doctor that you had rheumatic heart or heart valve problems","Find","Pt","^Patient","Ord","","PHENX","2.65","MIN","","TRIAL","","2","","","Has a doctor ever told you that you had rheumatic heart or heart valve problems?","PX040501010000","N","Finding; Findings; Ordinal; PhenX; Point in time; QL; Qual; Qualitative; Random; Screen","Rheumatic heart or heart valve problems","","","","","Ever told by doctor that you had rheumatic heart or heart valve problems","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.","0","0","0","","","","","","2.30","","" "58303-9","Ever told by doctor that you had angina","Find","Pt","^Patient","Ord","","PHENX","2.65","MIN","","TRIAL","","2","","","Has a doctor ever told you that you had angina?","PX040601010000","N","Finding; Findings; Ordinal; PhenX; Point in time; QL; Qual; Qualitative; Random; Screen","Angina","","","","","Ever told by doctor that you had angina","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.","0","0","0","","","","","","2.30","","" -"58304-7","Chest discomfort ever or since last exam or medical history update","TmStp","Pt","^Patient","Ord","","PHENX","2.65","MIN","","TRIAL","","2","","","Any chest discomfort eveSIRnce last exam or medical history update?","PX040601020000","N","Chest discomfort eveSIRnce last exam; Date and time; Hx; Ordinal; Past; PhenX; Point in time; QL; Qual; Qualitative; Random; Screen; Time stamp; Timestamp","Chest discomfort eveSIRnce last exam","","","","","Chest discomfort ever or since last exam or medical history update","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.","0","0","0","","","","","","2.30","","" +"58304-7","Chest discomfort ever or since last exam or medical history update","TmStp","Pt","^Patient","Ord","","PHENX","2.65","MIN","","TRIAL","","2","","","Any chest discomfort ever/since last exam or medical history update?","PX040601020000","N","Chest discomfort ever/since last exam; Date and time; Hx; Ordinal; Past; PhenX; Point in time; QL; Qual; Qualitative; Random; Screen; Time stamp; Timestamp","Chest discomfort ever/since last exam","","","","","Chest discomfort ever or since last exam or medical history update","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.","0","0","0","","","","","","2.30","","" "5830-5","Adenovirus Ag","PrThr","Pt","Tiss","Ord","IF","MICRO","2.73","MIN","","ACTIVE","","1","","","","","","ACIF; Adeno virus; Anticomplement Immunofluorescence; Antigen; Antigens; DFA; FA; Fluorescent antibody; Fluoresent; HAdV; ID; IFA; Immune fluorescence; Immunoflour; Immunofluor; Immunofluorescence; Infectious Disease; InfectiousDisease; Microbiology; Ordinal; Point in time; PR; QL; Qual; Qualitative; Random; Screen; Time Resolved Fluorescence; Tissue; Tissue, unspecified; TRF","HAdV Ag Tiss Ql IF","Both","","","","Adenovirus Ag [Presence] in Tissue by Immunofluorescence","","","","The PrThr property is used for LOINC terms whose results are reported using an ordered categorical scale, regardless of whether or not an internal threshold was used to make that determination. This change was approved by the Laboratory LOINC Committee in June 2016.","12067","0","0","","","","","","1.0","","Adenovirus Ag IF Ql (Tiss)" "58305-4","Chest discomfort with exertion or excitement","Find","Pt","^Patient","Ord","","PHENX","2.65","MIN","","TRIAL","","2","","","","PX040601030000","N","Chest discomf W exertion/excitement; Finding; Findings; Ordinal; PhenX; Point in time; QL; Qual; Qualitative; Random; Screen","Chest discomf W exertion/excitement","","","","","Chest discomfort with exertion or excitement","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.","0","0","0","","","","","","2.30","","" "58306-2","Chest discomfort when quiet or resting","Find","Pt","^Patient","Ord","","PHENX","2.65","MIN","","TRIAL","","2","","","","PX040601040000","N","Finding; Findings; Ordinal; PhenX; Point in time; QL; Qual; Qualitative; Random; Screen","Chest discomfort when quiet or resting","","","","","Chest discomfort when quiet or resting","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.","0","0","0","","","","","","2.30","","" @@ -58634,7 +58634,7 @@ "62660-6","PhenX - hormonal therapy protocol 100701","-","Pt","^Patient","-","PhenX","PANEL.PHENX","2.66","NAM","Female participants are asked whether they have ever used Evista® or Nolvadex® and then asked length of time they used it as well as whether they are currently using it. They are asked whether they are using any over-the-counter preparations for hormone replacement or post-menopause symptoms. Lastly, they are asked about their use of prescription female hormones (number of months taken, types, dosage). Note: PhenX staff removed embedded dates of original study for clarity of Toolkit users.","TRIAL","","2","","","","PX100701","N","Pan; Panel; PANEL.PHENX; Panl; Pnl; Point in time; Random","Hormonal therapy proto","","","","","PhenX - hormonal therapy protocol 100701","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.; Added the PhenX protocol ID to the Component to clearly define the protocol version for which this panel is based upon.","0","0","0","","","Panel","","","2.36","","" "6266-1","Lycopersicon lycopersicum Ab.IgE","ACnc","Pt","Ser","Qn","","ALLERGY","2.73","MIN","","ACTIVE","","1","","","","","Y","ABS; Aby; Allergen; Allergens; ALLERGY TESTING; Antby; Anti; Antibodies; Antibody; Arbitrary concentration; Autoantibodies; Autoantibody; f25; Immune globulin E; Immunoglobulin E; Lycopersicon esculatum; Lycopersicon lycopersicon; Point in time; QNT; Quan; Quant; Quantitative; Random; Serum; SR; Tomato; UniversalLabOrders","Tomato IgE Qn","Both","","","kIU/L; kU/L","Tomato IgE Ab [Units/volume] in Serum","k[IU]/L","","","","1964","0","0","","","","","","1.0d","","Tomato IgE Qn (S)" "62661-4","PhenX measure - human papillomavirus vaccine use","-","Pt","^Patient","-","PhenX","PANEL.PHENX","2.46","DEL","Questions to assess women's use of the human papillomavirus vaccine. These questions ascertain if a woman received the human papillomavirus vaccine and if so, the number of doses received. Use of the vaccine impacts a woman's risk of developing cervical cancer and the overall incidence rate of cervical cancer.","DEPRECATED","","2","","","","PhenX.100800","N","Measure - HPV vaccine use; Pan; Panel; PANEL.PHENX; Panl; Pnl; Point in time; Random","","","","","","Deprecated PhenX measure - human papillomavirus vaccine use","","","Measure terms were added to match PhenX hierarchy but make it difficult to locate protocols (which contain the set of variables you would use for a particular purpose). They have been deprecated and mapped directly to protocols.","","0","0","0","","","","","","2.36","","" -"62662-2","PhenX - human papillomavirus vaccine use protocol 100801","-","Pt","^Patient","-","PhenX","PANEL.PHENX","2.66","NAM","The interviewer asks the female participant whether she has ever received a human papillomavirus (HPV) vaccination. If she answers yes, the interviewer asks her age and how many shots she received. If the participant answers ""yes"" to question 1, the interviewer should complete the rest of the protocol. If the participant answers ""no"" then the protocol is deemed complete. The PhenX Working Group notes that GARDASIL® is also known as Silgard. European Medicines Agency. (September 25, 2009). Silgard European Public Assessment Report. Retrieved from http://www.emea.europa.eu/humandocs/Humans/EPASIRlgard/silgard.htm. Waknine, Yael. (October 2, 2006). International Approvals: Singulair and Gardasil/Silgard. Medscape Today. Retrieved from http://www.medscape.com/viewarticle/545374.","TRIAL","","2","","","","PX100801","N","HPV vaccine use proto; Pan; Panel; PANEL.PHENX; Panl; Pnl; Point in time; Random","HPV vaccine use proto","","","","","PhenX - human papillomavirus vaccine use protocol 100801","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.; Added the PhenX protocol ID to the Component to clearly define the protocol version for which this panel is based upon.","0","0","0","","","Panel","","","2.36","","" +"62662-2","PhenX - human papillomavirus vaccine use protocol 100801","-","Pt","^Patient","-","PhenX","PANEL.PHENX","2.66","NAM","The interviewer asks the female participant whether she has ever received a human papillomavirus (HPV) vaccination. If she answers yes, the interviewer asks her age and how many shots she received. If the participant answers ""yes"" to question 1, the interviewer should complete the rest of the protocol. If the participant answers ""no"" then the protocol is deemed complete. The PhenX Working Group notes that GARDASIL® is also known as Silgard. European Medicines Agency. (September 25, 2009). Silgard European Public Assessment Report. Retrieved from http://www.emea.europa.eu/humandocs/Humans/EPAR/silgard/silgard.htm. Waknine, Yael. (October 2, 2006). International Approvals: Singulair and Gardasil/Silgard. Medscape Today. Retrieved from http://www.medscape.com/viewarticle/545374.","TRIAL","","2","","","","PX100801","N","HPV vaccine use proto; Pan; Panel; PANEL.PHENX; Panl; Pnl; Point in time; Random","HPV vaccine use proto","","","","","PhenX - human papillomavirus vaccine use protocol 100801","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.; Added the PhenX protocol ID to the Component to clearly define the protocol version for which this panel is based upon.","0","0","0","","","Panel","","","2.36","","" "62663-0","PhenX measure - male reproductive tract birth defects","-","Pt","^Patient","-","PhenX","PANEL.PHENX","2.46","DEL","Questions to determine whether a male participant has ever had certain conditions that could have developed in utero. Cryptorchidism is failure of one or both of the testes to descend into the scrotum. Hypospadius is a developmental anomaly in which the male urethra opens on the underside of the penis or on the perineum. The purpose of these questions is to determine whether the participant had ever had the following abnormalities that developed in utero: Cryptorchidism, Hypospadius, and/or other related conditions. These conditions are suspected of being hereditary and/or influenced by environmental factors, may reflect abnormalities of androgen production, and may be passed to offspring.","DEPRECATED","","2","","","","PhenX.100900","N","Measure male reproduct birth defects; Pan; Panel; PANEL.PHENX; Panl; Pnl; Point in time; Random","","","","","","Deprecated PhenX measure - male reproductive tract birth defects","","","Measure terms were added to match PhenX hierarchy but make it difficult to locate protocols (which contain the set of variables you would use for a particular purpose). They have been deprecated and mapped directly to protocols.","","0","0","0","","","","","","2.36","","" "62664-8","PhenX - male reproductive tract birth defects protocol 100901","-","Pt","^Patient","-","PhenX","PANEL.PHENX","2.66","NAM","The male participant answers whether he was ever diagnosed with Cryptorchidism, Hypospadius and/or other related conditions. The questions were originally asked of partners of pregnant women but the WG recommends asking them of adult males. Note: Cryptorchidism is failure of one or both of the testes to descend into the scrotum. Hypospadius is a developmental anomaly in which the male urethra opens on the underside of the penis or on the perineum.","TRIAL","","2","","","","PX100901","N","Male reproductive birth defects proto; Pan; Panel; PANEL.PHENX; Panl; Pnl; Point in time; Random","Male reproductive birth defects proto","","","","","PhenX - male reproductive tract birth defects protocol 100901","","","","Updated the PhenX ID from ""PhenX."" to ""PX"" in Survey Question Source field to align with the variable identifier used in the PhenX Toolkit.; Added the PhenX protocol ID to the Component to clearly define the protocol version for which this panel is based upon.","0","0","0","","","Panel","","","2.36","","" "62665-5","PhenX measure - male sexual function","-","Pt","^Patient","-","PhenX","PANEL.PHENX","2.46","DEL","Questions to determine whether a male participant has certain types of sexual function difficulties. The purpose of these questions is to determine whether the participant ever had sexual difficulties regarding erection and/or performance.","DEPRECATED","","2","","","","PhenX.101000","N","FCN; Func; Funct; Pan; Panel; PANEL.PHENX; Panl; Pnl; Point in time; Random","","","","","","Deprecated PhenX measure - male sexual function","","","Measure terms were added to match PhenX hierarchy but make it difficult to locate protocols (which contain the set of variables you would use for a particular purpose). They have been deprecated and mapped directly to protocols.","","0","0","0","","","","","","2.36","","" diff --git a/data-raw/_pre_commit_hook.R b/data-raw/_pre_commit_hook.R index 7e2bb3ed2..d48b34785 100644 --- a/data-raw/_pre_commit_hook.R +++ b/data-raw/_pre_commit_hook.R @@ -369,20 +369,20 @@ changed_md5 <- function(object) { } # give official names to ABs and MOs -rsi <- clinical_breakpoints %>% +clin_break <- clinical_breakpoints %>% mutate(mo_name = mo_name(mo, language = NULL, keep_synonyms = TRUE, info = FALSE), .after = mo) %>% mutate(ab_name = ab_name(ab, language = NULL), .after = ab) -if (changed_md5(rsi)) { +if (changed_md5(clin_break)) { usethis::ui_info(paste0("Saving {usethis::ui_value('clinical_breakpoints')} to {usethis::ui_value('data-raw/')}")) - write_md5(rsi) - try(saveRDS(rsi, "data-raw/clinical_breakpoints.rds", version = 2, compress = "xz"), silent = TRUE) - try(write.table(rsi, "data-raw/clinical_breakpoints.txt", sep = "\t", na = "", row.names = FALSE), silent = TRUE) - try(haven::write_sas(rsi, "data-raw/clinical_breakpoints.sas"), silent = TRUE) - try(haven::write_sav(rsi, "data-raw/clinical_breakpoints.sav"), silent = TRUE) - try(haven::write_dta(rsi, "data-raw/clinical_breakpoints.dta"), silent = TRUE) - try(openxlsx::write.xlsx(rsi, "data-raw/clinical_breakpoints.xlsx"), silent = TRUE) - try(arrow::write_feather(rsi, "data-raw/clinical_breakpoints.feather"), silent = TRUE) - try(arrow::write_parquet(rsi, "data-raw/clinical_breakpoints.parquet"), silent = TRUE) + write_md5(clin_break) + try(saveRDS(clin_break, "data-raw/clinical_breakpoints.rds", version = 2, compress = "xz"), silent = TRUE) + try(write.table(clin_break, "data-raw/clinical_breakpoints.txt", sep = "\t", na = "", row.names = FALSE), silent = TRUE) + try(haven::write_sas(clin_break, "data-raw/clinical_breakpoints.sas"), silent = TRUE) + try(haven::write_sav(clin_break, "data-raw/clinical_breakpoints.sav"), silent = TRUE) + try(haven::write_dta(clin_break, "data-raw/clinical_breakpoints.dta"), silent = TRUE) + try(openxlsx::write.xlsx(clin_break, "data-raw/clinical_breakpoints.xlsx"), silent = TRUE) + try(arrow::write_feather(clin_break, "data-raw/clinical_breakpoints.feather"), silent = TRUE) + try(arrow::write_parquet(clin_break, "data-raw/clinical_breakpoints.parquet"), silent = TRUE) } if (changed_md5(microorganisms)) { diff --git a/data-raw/rsi.md5 b/data-raw/clin_break.md5 similarity index 100% rename from data-raw/rsi.md5 rename to data-raw/clin_break.md5 diff --git a/data-raw/clinical_breakpoints.dta b/data-raw/clinical_breakpoints.dta new file mode 100644 index 000000000..20cb0a67e Binary files /dev/null and b/data-raw/clinical_breakpoints.dta differ diff --git a/data-raw/clinical_breakpoints.feather b/data-raw/clinical_breakpoints.feather new file mode 100644 index 000000000..fe182eb45 Binary files /dev/null and b/data-raw/clinical_breakpoints.feather differ diff --git a/data-raw/clinical_breakpoints.parquet b/data-raw/clinical_breakpoints.parquet new file mode 100644 index 000000000..b18f0eeb0 Binary files /dev/null and b/data-raw/clinical_breakpoints.parquet differ diff --git a/data-raw/clinical_breakpoints.rds b/data-raw/clinical_breakpoints.rds new file mode 100644 index 000000000..3fe62cc75 Binary files /dev/null and b/data-raw/clinical_breakpoints.rds differ diff --git a/data-raw/clinical_breakpoints.sas b/data-raw/clinical_breakpoints.sas new file mode 100644 index 000000000..b41c2ab5f Binary files /dev/null and b/data-raw/clinical_breakpoints.sas differ diff --git a/data-raw/clinical_breakpoints.sav b/data-raw/clinical_breakpoints.sav new file mode 100644 index 000000000..5b96128b7 Binary files /dev/null and b/data-raw/clinical_breakpoints.sav differ diff --git a/data-raw/clinical_breakpoints.txt b/data-raw/clinical_breakpoints.txt new file mode 100644 index 000000000..aa3333f3d --- /dev/null +++ b/data-raw/clinical_breakpoints.txt @@ -0,0 +1,18309 @@ +"guideline" "method" "site" "mo" "mo_name" "rank_index" "ab" "ab_name" "ref_tbl" "disk_dose" "breakpoint_S" "breakpoint_R" "uti" +"EUCAST 2022" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CRYPT_NFRM" "Cryptococcus neoformans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2022" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "B. pseudomallei" "20ug/10ug" 50 22 FALSE +"EUCAST 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Gram-negative anaerobes" 4 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Gram-positive anaerobes" 4 8 FALSE +"EUCAST 2022" "DISK" "Intravenous" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 15 15 FALSE +"EUCAST 2022" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 50 15 FALSE +"EUCAST 2022" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 0.001 2 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE +"EUCAST 2022" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2022" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 18 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 19 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 19 TRUE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 8 FALSE +"EUCAST 2022" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 8 TRUE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 15 15 FALSE +"EUCAST 2022" "DISK" "UTI" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 15 15 TRUE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 16 16 FALSE +"EUCAST 2022" "MIC" "UTI" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 16 16 TRUE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 15 15 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 16 16 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 8 FALSE +"EUCAST 2022" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 15 15 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 16 16 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "AMK" "Amikacin" "Staphs" 8 8 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 1 1 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" "2ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Gram-negative anaerobes" 0.5 2 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Gram-positive anaerobes" 4 8 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMP" "Ampicillin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "Intravenous" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "L. monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2022" "MIC" "Intravenous" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "S. pneumoniae" "2ug" 22 19 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Gram-negative anaerobes" 0.5 2 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Gram-positive anaerobes" 4 8 FALSE +"EUCAST 2022" "MIC" "Oral" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 0.001 2 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMX" "Amoxicillin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 4 4 FALSE +"EUCAST 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 26 21 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2022" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 29 26 FALSE +"EUCAST 2022" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 1 4 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 50 18 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "H. influenzae" 4 4 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AZM" "Azithromycin" "Kingella" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "AZM" "Azithromycin" "Vibrio" "15ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "AZM" "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "AZM" "Azithromycin" "Vibrio" "15ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "AZM" "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "AZM" "Azithromycin" "Vibrio" "15ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "AZM" "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "AZM" "Azithromycin" "Vibrio" "15ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "AZM" "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "AZM" "Azithromycin" "Vibrio" "15ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "AZM" "Azithromycin" "Vibrio" 4 4 FALSE +"EUCAST 2022" "MIC" "B_MYCBC_TBRC" "Mycobacterium tuberculosis" 2 "BDQ" "Bedaquiline" "M. tuberculosis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "BPR" "Ceftobiprole" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" "5ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "BPR" "Ceftobiprole" "Staphs" "5ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "BPR" "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "BPR" "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2022" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" "10ug" 24 21 FALSE +"EUCAST 2022" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" 1 4 FALSE +"EUCAST 2022" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "B. pseudomallei" "10ug" 50 18 FALSE +"EUCAST 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 50 17 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 0.001 8 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "CAZ" "Ceftazidime" "Vibrio" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "CAZ" "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "CAZ" "Ceftazidime" "Vibrio" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "CAZ" "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "CAZ" "Ceftazidime" "Vibrio" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "CAZ" "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "CAZ" "Ceftazidime" "Vibrio" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "CAZ" "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "CAZ" "Ceftazidime" "Vibrio" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "CAZ" "Ceftazidime" "Vibrio" 1 1 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "S. pneumoniae" "30ug" 50 28 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "S. pneumoniae" 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" "5ug" 21 18 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CHL" "Chloramphenicol" "B. pseudomallei" "30ug" 50 22 FALSE +"EUCAST 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CHL" "Chloramphenicol" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Gram-negative anaerobes" 8 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Gram-positive anaerobes" 8 8 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "S. pneumoniae" "30ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "S. pneumoniae" 8 8 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 25 22 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 50 21 FALSE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 0.001 1 FALSE +"EUCAST 2022" "DISK" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" "5ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2022" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2022" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "Bacillus sp." "5ug" 50 23 FALSE +"EUCAST 2022" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "Bacillus sp." 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "CIP" "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE +"EUCAST 2022" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "CIP" "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "CIP" "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE +"EUCAST 2022" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "CIP" "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 50 25 FALSE +"EUCAST 2022" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 0.001 1 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" "5ug" 31 31 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2022" "MIC" "Prophylaxis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 50 26 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.001 0.5 FALSE +"EUCAST 2022" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 50 21 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 50 24 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 50 21 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CIP" "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "CIP" "Ciprofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "CIP" "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "CIP" "Ciprofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "CIP" "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "CIP" "Ciprofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "CIP" "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "CIP" "Ciprofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "CIP" "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "CIP" "Ciprofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "CIP" "Ciprofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "Bacillus sp." "2ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "Bacillus sp." 1 1 FALSE +"EUCAST 2022" "DISK" "B_BCTRD" "Bacteroides" 3 "CLI" "Clindamycin" "Bacteroides" "2ug" 10 10 FALSE +"EUCAST 2022" "MIC" "B_BCTRD" "Bacteroides" 3 "CLI" "Clindamycin" "Bacteroides" 4 4 FALSE +"EUCAST 2022" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "CLI" "Clindamycin" "C. acnes" "2ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "CLI" "Clindamycin" "C. acnes" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "CLI" "Clindamycin" "C. perfringens" "2ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "CLI" "Clindamycin" "C. perfringens" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "CLI" "Clindamycin" "F. necrophorum" "2ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "CLI" "Clindamycin" "F. necrophorum" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Gram-negative anaerobes" 4 4 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Gram-positive anaerobes" 4 4 FALSE +"EUCAST 2022" "DISK" "B_PRVTL" "Prevotella" 3 "CLI" "Clindamycin" "Prevotella" "2ug" 31 31 FALSE +"EUCAST 2022" "MIC" "B_PRVTL" "Prevotella" 3 "CLI" "Clindamycin" "Prevotella" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "S. pneumoniae" "2ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "H. influenzae" 32 32 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CLR" "Clarithromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 4 4 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" "10ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "CPT" "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2022" "DISK" "Non-pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 17 FALSE +"EUCAST 2022" "MIC" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "Non-pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2022" "DISK" "Pneumonia" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2022" "DISK" "Non-pneumonia" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 17 FALSE +"EUCAST 2022" "MIC" "Pneumonia" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "Non-pneumonia" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "S. pneumoniae" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 25 22 FALSE +"EUCAST 2022" "DISK" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 25 25 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" "30ug" 32 32 FALSE +"EUCAST 2022" "DISK" "Meningitis" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" "30ug" 32 32 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" "30ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" "30ug" 24 21 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" 1 2 FALSE +"EUCAST 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "S. pneumoniae" 0.5 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" "30ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2022" "DISK" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 20 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" "5ug" 27 27 FALSE +"EUCAST 2022" "DISK" "Meningitis" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" "5ug" 27 27 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" "5ug" 27 27 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" "5ug" 20 17 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" 1 2 FALSE +"EUCAST 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "S. pneumoniae" 0.5 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "CTX" "Cefotaxime" "Vibrio" "5ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "CTX" "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "CTX" "Cefotaxime" "Vibrio" "5ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "CTX" "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "CTX" "Cefotaxime" "Vibrio" "5ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "CTX" "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "CTX" "Cefotaxime" "Vibrio" "5ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "CTX" "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "CTX" "Cefotaxime" "Vibrio" "5ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "CTX" "Cefotaxime" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2022" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 50 19 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 19 19 TRUE +"EUCAST 2022" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 0.001 8 FALSE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" "30ug" 27 25 FALSE +"EUCAST 2022" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" "30ug" 50 27 FALSE +"EUCAST 2022" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 1 2 FALSE +"EUCAST 2022" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 0.001 1 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" "30ug" 29 29 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 21 18 FALSE +"EUCAST 2022" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2022" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 4 8 FALSE +"EUCAST 2022" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 0.001 4 FALSE +"EUCAST 2022" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" "10ug" 13 13 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Pseudo" "10ug/4ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Pseudo" 8 8 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CZA" "Ceftazidime/avibactam" "PK/PD" 8 8 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Enterobacteriaceae" "30ug" 50 20 TRUE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Enterobacteriaceae" 0.001 4 TRUE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" "30ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "DISK" "Pneumonia" "B_HMPHL" "Haemophilus" 3 "CZT" "Ceftolozane/tazobactam" "H. influenzae" "30ug/10ug" 23 23 FALSE +"EUCAST 2022" "MIC" "Pneumonia" "B_HMPHL" "Haemophilus" 3 "CZT" "Ceftolozane/tazobactam" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" "30ug/10ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" 4 4 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "CZT" "Ceftolozane/tazobactam" "PK/PD" 4 4 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "DAL" "Dalbavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "DAL" "Dalbavancin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2022" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "DFX" "Delafloxacin" "Enterobacteriaceae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "DFX" "Delafloxacin" "Staphs" 0.016 0.016 FALSE +"EUCAST 2022" "MIC" "Skin" "B_STPHY_AURS" "Staphylococcus aureus" 2 "DFX" "Delafloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "DFX" "Delafloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "DFX" "Delafloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "DFX" "Delafloxacin" "Strep A, B, C, G" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "B_STRPT_CNST" "Streptococcus constellatus" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "B_STRPT_INTR" "Streptococcus intermedius" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "B_MYCBC_TBRC" "Mycobacterium tuberculosis" 2 "DLM" "Delamanid" "M. tuberculosis" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" "10ug" 24 21 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." "10ug" 50 22 FALSE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." 0.001 2 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOR" "Doripenem" "Gram-negative anaerobes" 1 1 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "DOR" "Doripenem" "Gram-positive anaerobes" 1 1 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "H. influenzae" "10ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" "10ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" 1 1 FALSE +"EUCAST 2022" "DISK" "UTI" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" "10ug" 50 22 TRUE +"EUCAST 2022" "MIC" "UTI" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" 0.001 2 TRUE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "S. pneumoniae" 1 1 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "B. pseudomallei" 0.001 2 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "DOX" "Doxycycline" "H. influenzae" 1 2 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "DOX" "Doxycycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "S. pneumoniae" 1 2 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "DOX" "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "DOX" "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "DOX" "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "DOX" "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "DOX" "Doxycycline" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_ENTRC_FACM" "Enterococcus faecium" 2 "ERV" "Eravacycline" "Enterococcus" "20ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "ERV" "Eravacycline" "Enterococcus" "20ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "ERV" "Eravacycline" "Enterobacteriaceae" "20ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "ERV" "Eravacycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ERV" "Eravacycline" "Staphs" "20ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ERV" "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ERV" "Eravacycline" "Staphs" "20ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ERV" "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERV" "Eravacycline" "Viridans strept" "20ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERV" "Eravacycline" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "Bacillus sp." "15ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "Bacillus sp." 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "C. jejuni, C. coli" "15ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "C. jejuni, C. coli" 8 8 FALSE +"EUCAST 2022" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "C. jejuni, C. coli" "15ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "C. jejuni, C. coli" 4 4 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "ERY" "Erythromycin" "H. influenzae" 16 16 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" "15ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "L. monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 21 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2022" "MIC" "Screen" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "S. pneumoniae" "15ug" 22 19 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "ERY" "Erythromycin" "Vibrio" "15ug" 12 12 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "ERY" "Erythromycin" "Vibrio" "15ug" 12 12 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "ERY" "Erythromycin" "Vibrio" "15ug" 12 12 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "ERY" "Erythromycin" "Vibrio" "15ug" 12 12 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "ERY" "Erythromycin" "Vibrio" "15ug" 12 12 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Gram-negative anaerobes" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Gram-positive anaerobes" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" "10ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Enterobacteriaceae" "30ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Pseudo" "30ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Pseudo" 2 2 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 27 24 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2022" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" "30ug" 27 24 FALSE +"EUCAST 2022" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" 1 4 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" "30ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" 4 4 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 50 21 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 0.001 8 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "S. pneumoniae" 1 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2022" "MIC" "F_CANDD" "Candida" 3 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.001 16 FALSE +"EUCAST 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "FLU" "Fluconazole" "PK/PD" 2 4 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2022" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2022" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 27 27 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 27 27 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 17 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 17 TRUE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 2 TRUE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 TRUE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2022" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 TRUE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IMR" "Imipenem/relebactam" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "IMR" "Imipenem/relebactam" "Acinetobacter spp." "10ug/25ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "IMR" "Imipenem/relebactam" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IMR" "Imipenem/relebactam" "Gram-negative anaerobes" 2 2 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IMR" "Imipenem/relebactam" "Gram-positive anaerobes" 2 2 FALSE +"EUCAST 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Pseudo" "10ug/25ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Pseudo" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IMR" "Imipenem/relebactam" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "IMR" "Imipenem/relebactam" "PK/PD" 2 2 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 24 21 FALSE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2022" "DISK" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "Bacillus sp." "10ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "Bacillus sp." 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "B. pseudomallei" "10ug" 29 29 FALSE +"EUCAST 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "B. pseudomallei" 2 2 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 50 21 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 0.001 4 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Gram-negative anaerobes" 2 4 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Gram-positive anaerobes" 2 4 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "DISK" "B_MRGNL" "Morganella" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 19 FALSE +"EUCAST 2022" "MIC" "B_MRGNL" "Morganella" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2022" "DISK" "B_MRGNL_MRGN_MRGN" "Morganella morganii morganii" 1 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2022" "MIC" "B_MRGNL_MRGN_MRGN" "Morganella morganii morganii" 1 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2022" "DISK" "B_PROTS" "Proteus" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 19 FALSE +"EUCAST 2022" "MIC" "B_PROTS" "Proteus" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2022" "DISK" "B_PRVDN" "Providencia" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 19 FALSE +"EUCAST 2022" "MIC" "B_PRVDN" "Providencia" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 50 20 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 0.001 4 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_FLAVS" "Aspergillus flavus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "ISV" "Isavuconazole" "Aspergillus" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_FLAVS" "Aspergillus flavus" 2 "ITR" "Itraconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "ITR" "Itraconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "ITR" "Itraconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "ITR" "Itraconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "KAN" "Kanamycin" "Staphs" 8 8 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "KAN" "Kanamycin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2022" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "KAN" "Kanamycin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "KAN" "Kanamycin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LMU" "Lefamulin" "Staphs" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LMU" "Lefamulin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LMU" "Lefamulin" "Staphs" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LMU" "Lefamulin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LMU" "Lefamulin" "S. pneumoniae" "5ug" 12 12 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LMU" "Lefamulin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_BCLLS" "Bacillus" 3 "LNZ" "Linezolid" "Bacillus sp." "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_BCLLS" "Bacillus" 3 "LNZ" "Linezolid" "Bacillus sp." 2 2 FALSE +"EUCAST 2022" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "S. pneumoniae" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 2 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 23 19 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 23 20 FALSE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 0.5 1 FALSE +"EUCAST 2022" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2022" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2022" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" 0.5 1 FALSE +"EUCAST 2022" "DISK" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "Bacillus sp." "5ug" 50 23 FALSE +"EUCAST 2022" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "Bacillus sp." 0.001 1 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2022" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" "5ug" 29 29 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 50 22 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 0.001 2 FALSE +"EUCAST 2022" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 50 22 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 50 24 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 50 22 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LVX" "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 50 17 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 0.001 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "S. pneumoniae" "5ug" 50 16 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "S. pneumoniae" 0.001 2 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "LVX" "Levofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "LVX" "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "LVX" "Levofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "LVX" "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "LVX" "Levofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "LVX" "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "LVX" "Levofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "LVX" "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "LVX" "Levofloxacin" "Vibrio" "5ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "LVX" "Levofloxacin" "Vibrio" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "UTI" "B_CTRBC" "Citrobacter" 3 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_CTRBC" "Citrobacter" 3 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "B_ENTRBC" "Enterobacter" 3 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ENTRBC" "Enterobacter" 3 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL" "Klebsiella" 3 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL" "Klebsiella" 3 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "UTI" "B_RLTLL" "Raoultella" 3 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_RLTLL" "Raoultella" 3 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2022" "DISK" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2022" "DISK" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "DISK" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "MEM" "Meropenem" "A. xylosoxidans" "10ug" 26 20 FALSE +"EUCAST 2022" "MIC" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "MEM" "Meropenem" "A. xylosoxidans" 1 4 FALSE +"EUCAST 2022" "DISK" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "MEM" "Meropenem" "A. xylosoxidans" "10ug" 26 20 FALSE +"EUCAST 2022" "MIC" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "MEM" "Meropenem" "A. xylosoxidans" 1 4 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2022" "DISK" "Meningitis" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 21 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2022" "DISK" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" "10ug" 31 31 FALSE +"EUCAST 2022" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_BCLLS" "Bacillus" 3 "MEM" "Meropenem" "Bacillus sp." "10ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_BCLLS" "Bacillus" 3 "MEM" "Meropenem" "Bacillus sp." 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_BCTRD" "Bacteroides" 3 "MEM" "Meropenem" "Bacteroides" "10ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_BCTRD" "Bacteroides" 3 "MEM" "Meropenem" "Bacteroides" 1 1 FALSE +"EUCAST 2022" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "MEM" "Meropenem" "B. pseudomallei" "10ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "MEM" "Meropenem" "B. pseudomallei" 2 2 FALSE +"EUCAST 2022" "DISK" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "MEM" "Meropenem" "C. acnes" "10ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "MEM" "Meropenem" "C. acnes" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "MEM" "Meropenem" "C. perfringens" "10ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "MEM" "Meropenem" "C. perfringens" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "MEM" "Meropenem" "F. necrophorum" "10ug" 35 35 FALSE +"EUCAST 2022" "MIC" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "MEM" "Meropenem" "F. necrophorum" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Gram-negative anaerobes" 2 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Gram-positive anaerobes" 2 8 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" "10ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "L. monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "L. monocytogenes" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" "10ug" 33 33 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_PRVTL" "Prevotella" 3 "MEM" "Meropenem" "Prevotella" "10ug" 34 34 FALSE +"EUCAST 2022" "MIC" "B_PRVTL" "Prevotella" 3 "MEM" "Meropenem" "Prevotella" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Pseudo" "10ug" 20 14 FALSE +"EUCAST 2022" "DISK" "Meningitis" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Pseudo" "10ug" 20 20 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Pseudo" 2 2 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "S. pneumoniae" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "MEM" "Meropenem" "Vibrio" "10ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "MEM" "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "MEM" "Meropenem" "Vibrio" "10ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "MEM" "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "MEM" "Meropenem" "Vibrio" "10ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "MEM" "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "MEM" "Meropenem" "Vibrio" "10ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "MEM" "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "MEM" "Meropenem" "Vibrio" "10ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "MEM" "Meropenem" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Enterobacteriaceae" "20ug/10ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEV" "Meropenem/vaborbactam" "Pseudo" "20ug/10ug" 14 14 FALSE +"EUCAST 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEV" "Meropenem/vaborbactam" "Pseudo" 8 8 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "MEV" "Meropenem/vaborbactam" "PK/PD" 8 8 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" "5ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "S. pneumoniae" "5ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2022" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 2 2 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" "30ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" "30ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" 1 1 FALSE +"EUCAST 2022" "MIC" "Prophylaxis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "S. pneumoniae" "30ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_BCTRD" "Bacteroides" 3 "MTR" "Metronidazole" "Bacteroides" "5ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_BCTRD" "Bacteroides" 3 "MTR" "Metronidazole" "Bacteroides" 4 4 FALSE +"EUCAST 2022" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2022" "DISK" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "MTR" "Metronidazole" "C. perfringens" "5ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "MTR" "Metronidazole" "C. perfringens" 4 4 FALSE +"EUCAST 2022" "DISK" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "MTR" "Metronidazole" "F. necrophorum" "5ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "MTR" "Metronidazole" "F. necrophorum" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Gram-negative anaerobes" 4 4 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Gram-positive anaerobes" 4 4 FALSE +"EUCAST 2022" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2022" "DISK" "B_PRVTL" "Prevotella" 3 "MTR" "Metronidazole" "Prevotella" "5ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_PRVTL" "Prevotella" 3 "MTR" "Metronidazole" "Prevotella" 4 4 FALSE +"EUCAST 2022" "DISK" "Screen" "B_HMPHL" "Haemophilus" 3 "NAL" "Nalidixic acid" "H. influenzae" "30ug" 23 23 FALSE +"EUCAST 2022" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. catarrhalis" "30ug" 23 23 FALSE +"EUCAST 2022" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2022" "DISK" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" "100ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" 16 16 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2022" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2022" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2022" "DISK" "UTI" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2022" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 22 TRUE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 0.5 TRUE +"EUCAST 2022" "DISK" "B_AERCC" "Aerococcus" 3 "NOR" "Norfloxacin" "Aerococcus" "10ug" 17 17 FALSE +"EUCAST 2022" "DISK" "Screen" "B_BCLLS" "Bacillus" 3 "NOR" "Norfloxacin" "Bacillus sp." "10ug" 21 21 FALSE +"EUCAST 2022" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "S. pneumoniae" "10ug" 10 10 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NTR" "Nitroxoline" "Enterobacteriaceae" "30ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NTR" "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 24 22 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" "5ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ORI" "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ORI" "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "ORI" "Oritavancin" "PK/PD" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY_CGLN" "Staphylococcus coagulans" 2 "OXA" "Oxacillin" "Staphs" "1 unit" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Staphs" "1 unit" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Staphs" "1 unit" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "S. pneumoniae" "1ug" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2022" "DISK" "Screen" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "PEF" "Pefloxacin" "Vibrio" "5ug" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "PEF" "Pefloxacin" "Vibrio" "5ug" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "PEF" "Pefloxacin" "Vibrio" "5ug" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "PEF" "Pefloxacin" "Vibrio" "5ug" 20 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "PEF" "Pefloxacin" "Vibrio" "5ug" 20 20 FALSE +"EUCAST 2022" "DISK" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" "1 unit" 21 21 FALSE +"EUCAST 2022" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2022" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "PEN" "Benzylpenicillin" "C. acnes" "1 unit" 24 24 FALSE +"EUCAST 2022" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "PEN" "Benzylpenicillin" "C. acnes" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "PEN" "Benzylpenicillin" "C. perfringens" "1 unit" 15 15 FALSE +"EUCAST 2022" "MIC" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "PEN" "Benzylpenicillin" "C. perfringens" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "PEN" "Benzylpenicillin" "F. necrophorum" "1 unit" 25 25 FALSE +"EUCAST 2022" "MIC" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "PEN" "Benzylpenicillin" "F. necrophorum" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Gram-negative anaerobes" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Gram-positive anaerobes" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "Screen" "B_HMPHL" "Haemophilus" 3 "PEN" "Benzylpenicillin" "H. influenzae" "1 unit" 12 12 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" "1 unit" 25 25 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "L. monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_PRVTL" "Prevotella" 3 "PEN" "Benzylpenicillin" "Prevotella" "1 unit" 20 20 FALSE +"EUCAST 2022" "MIC" "B_PRVTL" "Prevotella" 3 "PEN" "Benzylpenicillin" "Prevotella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "P. multocida" "1 unit" 17 17 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "P. multocida" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2022" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "Non-meningitis" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2022" "DISK" "Meningitis" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 19 19 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "S. pneumoniae" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "S. pneumoniae" 0.064 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2022" "MIC" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 1024 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Gram-negative anaerobes" 16 16 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Gram-positive anaerobes" 8 16 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 50 18 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2022" "DISK" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" "5ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2022" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2022" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2022" "DISK" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" "5ug" 18 18 FALSE +"EUCAST 2022" "MIC" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" "5ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "Prophylaxis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 21 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "S. pneumoniae" "5ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "S. pneumoniae" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Gram-negative anaerobes" 4 8 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Gram-positive anaerobes" 4 8 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "H. influenzae" 1 1 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. catarrhalis" 1 1 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2022" "DISK" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "SXT" "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" "1.25ug/23.75ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "SXT" "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "SXT" "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" "1.25ug/23.75ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "SXT" "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2022" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" "1.25ug/23.75ug" 19 16 FALSE +"EUCAST 2022" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" 2 4 FALSE +"EUCAST 2022" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "B. pseudomallei" "1.25ug/23.75ug" 50 17 FALSE +"EUCAST 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "B. pseudomallei" 0.001 4 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" "1.25ug/23.75ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "L. monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2022" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "L. monocytogenes" 0.064 0.064 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2022" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 50 16 FALSE +"EUCAST 2022" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 0.001 4 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "S. pneumoniae" "1.25ug/23.75ug" 13 10 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "S. pneumoniae" 1 2 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" "1.25ug/23.75ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Vibrio" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 20 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Gram-negative anaerobes" 8 16 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Gram-positive anaerobes" 8 16 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 50 18 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2022" "DISK" "Screen" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "B. pseudomallei" "30ug" 23 23 FALSE +"EUCAST 2022" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "TCY" "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "TCY" "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE +"EUCAST 2022" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "TCY" "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE +"EUCAST 2022" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "TCY" "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE +"EUCAST 2022" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2022" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" "30ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" 2 2 FALSE +"EUCAST 2022" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" "30ug" 28 28 FALSE +"EUCAST 2022" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" "30ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" 2 2 FALSE +"EUCAST 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2022" "MIC" "Screen" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 2 2 FALSE +"EUCAST 2022" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2022" "MIC" "Screen" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 23 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2022" "MIC" "Screen" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "S. pneumoniae" "30ug" 25 22 FALSE +"EUCAST 2022" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "S. pneumoniae" "30ug" 25 25 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "S. pneumoniae" 1 2 FALSE +"EUCAST 2022" "MIC" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "S. pneumoniae" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "TCY" "Tetracycline" "Vibrio" "30ug" 20 20 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "TCY" "Tetracycline" "Vibrio" "30ug" 20 20 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "TCY" "Tetracycline" "Vibrio" "30ug" 20 20 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "TCY" "Tetracycline" "Vibrio" "30ug" 20 20 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "TCY" "Tetracycline" "Vibrio" "30ug" 20 20 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "S. pneumoniae" "30ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL" "Klebsiella" 3 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL" "Klebsiella" 3 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL_GRNL" "Klebsiella granulomatis" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL_GRNL" "Klebsiella granulomatis" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL_OXYT" "Klebsiella oxytoca" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL_OXYT" "Klebsiella oxytoca" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL_PNMN_OZAN" "Klebsiella pneumoniae ozaenae" 1 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL_PNMN_OZAN" "Klebsiella pneumoniae ozaenae" 1 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL_PNMN_RHNS" "Klebsiella pneumoniae rhinoscleromatis" 1 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL_PNMN_RHNS" "Klebsiella pneumoniae rhinoscleromatis" 1 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL_QSPN" "Klebsiella quasipneumoniae" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL_QSPN" "Klebsiella quasipneumoniae" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_KLBSL_VRCL" "Klebsiella variicola" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_KLBSL_VRCL" "Klebsiella variicola" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2022" "MIC" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2022" "DISK" "B_CTRBC_KOSR" "Citrobacter koseri" 2 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_CTRBC_KOSR" "Citrobacter koseri" 2 "TGC" "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_ENTRC_FACM" "Enterococcus faecium" 2 "TGC" "Tigecycline" "Enterococcus" "15ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "TGC" "Tigecycline" "Enterococcus" "15ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "TGC" "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 19 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 20 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Gram-negative anaerobes" 16 16 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Gram-positive anaerobes" 8 16 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 50 18 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "H. influenzae" 8 8 FALSE +"EUCAST 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "S. pneumoniae" "15ug" 23 20 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 15 15 TRUE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 4 4 TRUE +"EUCAST 2022" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2022" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2022" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 14 14 TRUE +"EUCAST 2022" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 4 4 TRUE +"EUCAST 2022" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 16 16 FALSE +"EUCAST 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 16 16 TRUE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 2 TRUE +"EUCAST 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2022" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 TRUE +"EUCAST 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2022" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 TRUE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 18 18 FALSE +"EUCAST 2022" "DISK" "UTI" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 18 18 TRUE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 2 2 FALSE +"EUCAST 2022" "MIC" "UTI" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 2 2 TRUE +"EUCAST 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2022" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" "2ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "TZD" "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_CNST" "Streptococcus constellatus" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STRPT_CNST" "Streptococcus constellatus" 2 "TZD" "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_STRPT_INTR" "Streptococcus intermedius" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2022" "MIC" "B_STRPT_INTR" "Streptococcus intermedius" 2 "TZD" "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2022" "DISK" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "TZP" "Piperacillin/tazobactam" "A. xylosoxidans" "30ug/6ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "TZP" "Piperacillin/tazobactam" "A. xylosoxidans" 4 4 FALSE +"EUCAST 2022" "DISK" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "TZP" "Piperacillin/tazobactam" "A. xylosoxidans" "30ug/6ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "TZP" "Piperacillin/tazobactam" "A. xylosoxidans" 4 4 FALSE +"EUCAST 2022" "DISK" "B_BCTRD" "Bacteroides" 3 "TZP" "Piperacillin/tazobactam" "Bacteroides" "30ug/6ug" 20 20 FALSE +"EUCAST 2022" "MIC" "B_BCTRD" "Bacteroides" 3 "TZP" "Piperacillin/tazobactam" "Bacteroides" 8 8 FALSE +"EUCAST 2022" "DISK" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "TZP" "Piperacillin/tazobactam" "C. acnes" "30ug/6ug" 27 27 FALSE +"EUCAST 2022" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "TZP" "Piperacillin/tazobactam" "C. acnes" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "TZP" "Piperacillin/tazobactam" "C. perfringens" "30ug/6ug" 24 24 FALSE +"EUCAST 2022" "MIC" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "TZP" "Piperacillin/tazobactam" "C. perfringens" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "TZP" "Piperacillin/tazobactam" "F. necrophorum" "30ug/6ug" 32 32 FALSE +"EUCAST 2022" "MIC" "B_FSBCTR_NCRP_NCRP" "Fusobacterium necrophorum necrophorum" 1 "TZP" "Piperacillin/tazobactam" "F. necrophorum" 0.5 0.5 FALSE +"EUCAST 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Gram-negative anaerobes" 8 16 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Gram-positive anaerobes" 8 16 FALSE +"EUCAST 2022" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "H. influenzae" "30ug/6ug" 27 27 FALSE +"EUCAST 2022" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2022" "DISK" "B_PRVTL" "Prevotella" 3 "TZP" "Piperacillin/tazobactam" "Prevotella" "30ug/6ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_PRVTL" "Prevotella" 3 "TZP" "Piperacillin/tazobactam" "Prevotella" 0.5 0.5 FALSE +"EUCAST 2022" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 50 18 FALSE +"EUCAST 2022" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 0.001 16 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" "30ug/6ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_ALGN" "Vibrio alginolyticus" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" "30ug/6ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" "30ug/6ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_FLVL" "Vibrio fluvialis" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" "30ug/6ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_PRHM" "Vibrio parahaemolyticus" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "DISK" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" "30ug/6ug" 26 26 FALSE +"EUCAST 2022" "MIC" "B_VIBRI_VLNF" "Vibrio vulnificus" 2 "TZP" "Piperacillin/tazobactam" "Vibrio" 1 1 FALSE +"EUCAST 2022" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2022" "DISK" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" "5ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" 1 1 FALSE +"EUCAST 2022" "DISK" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "Bacillus sp." "5ug" 10 10 FALSE +"EUCAST 2022" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "Bacillus sp." 2 2 FALSE +"EUCAST 2022" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2022" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2022" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2022" "DISK" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "C. acnes" "5ug" 22 22 FALSE +"EUCAST 2022" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "C. acnes" 2 2 FALSE +"EUCAST 2022" "DISK" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "VAN" "Vancomycin" "C. perfringens" "5ug" 12 12 FALSE +"EUCAST 2022" "MIC" "B_CTRDM_PRFR" "Clostridium perfringens" 2 "VAN" "Vancomycin" "C. perfringens" 2 2 FALSE +"EUCAST 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2022" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Gram-positive anaerobes" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2022" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "S. pneumoniae" "5ug" 16 16 FALSE +"EUCAST 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "S. pneumoniae" 2 2 FALSE +"EUCAST 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "VOR" "Voriconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2022" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "VOR" "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2021" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2021" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2021" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "B. pseudomallei" "20ug/10ug" 50 22 FALSE +"EUCAST 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Gram-negative anaerobes" 4 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Gram-positive anaerobes" 4 8 FALSE +"EUCAST 2021" "DISK" "Intravenous" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 15 15 FALSE +"EUCAST 2021" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 50 15 FALSE +"EUCAST 2021" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE +"EUCAST 2021" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 0.001 2 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE +"EUCAST 2021" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2021" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 18 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 19 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 19 TRUE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 8 FALSE +"EUCAST 2021" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 8 TRUE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 15 15 FALSE +"EUCAST 2021" "DISK" "UTI" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 15 15 TRUE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 16 16 FALSE +"EUCAST 2021" "MIC" "UTI" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 16 16 TRUE +"EUCAST 2021" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 8 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "AMK" "Amikacin" "Staphs" 8 8 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 1 1 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "DISK" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" "2ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Gram-negative anaerobes" 0.5 2 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Gram-positive anaerobes" 4 8 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" "2ug" 18 18 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" 1 1 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMP" "Ampicillin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "Intravenous" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "L. monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2021" "MIC" "Intravenous" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2021" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "S. pneumoniae" "2ug" 22 16 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "S. pneumoniae" 0.5 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Gram-negative anaerobes" 0.5 2 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Gram-positive anaerobes" 4 8 FALSE +"EUCAST 2021" "MIC" "Oral" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 2 2 FALSE +"EUCAST 2021" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 0.001 2 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMX" "Amoxicillin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 0.002 4 FALSE +"EUCAST 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 26 21 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2021" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 29 26 FALSE +"EUCAST 2021" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 1 4 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 50 18 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 0.001 16 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "H. influenzae" 4 4 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AZM" "Azithromycin" "Kingella" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_MYCBC_TBRC" "Mycobacterium tuberculosis" 2 "BDQ" "Bedaquiline" "M. tuberculosis" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "BPR" "Ceftobiprole" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "BPR" "Ceftobiprole" "Staphs" "5ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "BPR" "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "BPR" "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2021" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" "10ug" 24 21 FALSE +"EUCAST 2021" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" 1 4 FALSE +"EUCAST 2021" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "B. pseudomallei" "10ug" 50 18 FALSE +"EUCAST 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 50 17 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 0.001 8 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "S. pneumoniae" "30ug" 50 28 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "S. pneumoniae" 0.001 0.5 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" "5ug" 21 18 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CHL" "Chloramphenicol" "B. pseudomallei" "30ug" 50 22 FALSE +"EUCAST 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CHL" "Chloramphenicol" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Gram-negative anaerobes" 8 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Gram-positive anaerobes" 8 8 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" 2 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 2 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "S. pneumoniae" "30ug" 21 21 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "S. pneumoniae" 8 8 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 25 22 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 50 21 FALSE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 0.001 1 FALSE +"EUCAST 2021" "DISK" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" "5ug" 21 21 FALSE +"EUCAST 2021" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2021" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2021" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "Bacillus sp." "5ug" 50 23 FALSE +"EUCAST 2021" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "Bacillus sp." 0.001 0.5 FALSE +"EUCAST 2021" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "CIP" "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE +"EUCAST 2021" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "CIP" "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE +"EUCAST 2021" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "CIP" "Ciprofloxacin" "C. jejuni, C. coli" "5ug" 50 26 FALSE +"EUCAST 2021" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "CIP" "Ciprofloxacin" "C. jejuni, C. coli" 0.001 0.5 FALSE +"EUCAST 2021" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 50 25 FALSE +"EUCAST 2021" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 0.001 1 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" "5ug" 31 31 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 50 26 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.001 0.5 FALSE +"EUCAST 2021" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 50 24 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 50 21 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CIP" "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "Bacillus sp." "2ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "Bacillus sp." 1 1 FALSE +"EUCAST 2021" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Gram-negative anaerobes" 4 4 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Gram-positive anaerobes" 4 4 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "S. pneumoniae" "2ug" 19 19 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "H. influenzae" 32 32 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CLR" "Clarithromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 2 2 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" "10ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CPT" "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2021" "DISK" "Pneumonia" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2021" "DISK" "Non-pneumonia" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 17 FALSE +"EUCAST 2021" "MIC" "Pneumonia" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2021" "MIC" "Non-pneumonia" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "S. pneumoniae" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 25 22 FALSE +"EUCAST 2021" "DISK" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 25 25 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" "30ug" 32 32 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" "30ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" "30ug" 24 21 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" 1 2 FALSE +"EUCAST 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "S. pneumoniae" 0.5 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" "30ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" 1 1 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2021" "DISK" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 20 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" "5ug" 27 27 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" "5ug" 27 27 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" "5ug" 20 17 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" 1 2 FALSE +"EUCAST 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "S. pneumoniae" 0.5 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2021" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 50 19 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 19 19 TRUE +"EUCAST 2021" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 0.001 8 FALSE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "DISK" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" "30ug" 27 25 FALSE +"EUCAST 2021" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" "30ug" 50 27 FALSE +"EUCAST 2021" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 1 2 FALSE +"EUCAST 2021" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 0.001 1 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" "30ug" 29 29 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 21 18 FALSE +"EUCAST 2021" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2021" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 4 8 FALSE +"EUCAST 2021" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 0.001 4 FALSE +"EUCAST 2021" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2021" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" "10ug/4ug" 13 13 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Pseudo" "10ug/4ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Pseudo" 8 8 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CZA" "Ceftazidime/avibactam" "PK/PD" 8 8 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Enterobacteriaceae" "30ug" 50 20 TRUE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Enterobacteriaceae" 0.001 4 TRUE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" "30ug/10ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2021" "DISK" "Pneumonia" "B_HMPHL" "Haemophilus" 3 "CZT" "Ceftolozane/tazobactam" "H. influenzae" "30ug/10ug" 23 23 FALSE +"EUCAST 2021" "MIC" "Pneumonia" "B_HMPHL" "Haemophilus" 3 "CZT" "Ceftolozane/tazobactam" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" "30ug/10ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" 4 4 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "CZT" "Ceftolozane/tazobactam" "PK/PD" 4 4 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "DAL" "Dalbavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "DAL" "Dalbavancin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C. difficile" 4 1024 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2021" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "DFX" "Delafloxacin" "Enterobacteriaceae" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "DFX" "Delafloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "DFX" "Delafloxacin" "Strep A, B, C, G" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "B_STRPT_CNST" "Streptococcus constellatus" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "B_STRPT_INTR" "Streptococcus intermedius" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "B_MYCBC_TBRC" "Mycobacterium tuberculosis" 2 "DLM" "Delamanid" "M. tuberculosis" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" "10ug" 24 21 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." "10ug" 50 22 FALSE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." 0.001 2 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOR" "Doripenem" "Gram-negative anaerobes" 1 1 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "DOR" "Doripenem" "Gram-positive anaerobes" 1 1 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "H. influenzae" "10ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "H. influenzae" 1 1 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" "10ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" 1 1 FALSE +"EUCAST 2021" "DISK" "UTI" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" "10ug" 50 22 TRUE +"EUCAST 2021" "MIC" "UTI" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" 0.001 2 TRUE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "S. pneumoniae" 1 1 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "B. pseudomallei" 0.001 2 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "DOX" "Doxycycline" "H. influenzae" 1 2 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "DOX" "Doxycycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "S. pneumoniae" 1 2 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_ENTRC_FACM" "Enterococcus faecium" 2 "ERV" "Eravacycline" "Enterococcus" "20ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "ERV" "Eravacycline" "Enterococcus" "20ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "ERV" "Eravacycline" "Enterobacteriaceae" "20ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "ERV" "Eravacycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ERV" "Eravacycline" "Staphs" "20ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ERV" "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERV" "Eravacycline" "Viridans strept" "20ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERV" "Eravacycline" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "Bacillus sp." "15ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "Bacillus sp." 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "C. jejuni, C. coli" "15ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "C. jejuni, C. coli" 8 8 FALSE +"EUCAST 2021" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "C. jejuni, C. coli" "15ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "C. jejuni, C. coli" 4 4 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "ERY" "Erythromycin" "H. influenzae" 16 16 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" "15ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "L. monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "S. pneumoniae" "15ug" 22 19 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Gram-negative anaerobes" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Gram-positive anaerobes" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" "10ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Enterobacteriaceae" "30ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Pseudo" "30ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Pseudo" 2 2 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 27 24 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2021" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" "30ug" 27 24 FALSE +"EUCAST 2021" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" 1 4 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" "30ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" 4 4 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 50 21 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 0.001 8 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "S. pneumoniae" 1 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2021" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.002 32 FALSE +"EUCAST 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "FLU" "Fluconazole" "PK/PD" 2 4 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 21 21 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2021" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2021" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C. difficile" 2 1024 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 17 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 17 TRUE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 2 TRUE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 TRUE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2021" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 TRUE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2021" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IMR" "Imipenem/relebactam" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "IMR" "Imipenem/relebactam" "Acinetobacter spp." "10ug/25ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "IMR" "Imipenem/relebactam" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IMR" "Imipenem/relebactam" "Gram-negative anaerobes" 2 2 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IMR" "Imipenem/relebactam" "Gram-positive anaerobes" 2 2 FALSE +"EUCAST 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Pseudo" "10ug/25ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Pseudo" 2 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IMR" "Imipenem/relebactam" "Viridans strept" 2 2 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "IMR" "Imipenem/relebactam" "PK/PD" 2 2 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 24 21 FALSE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2021" "DISK" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "Bacillus sp." "10ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "Bacillus sp." 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "B. pseudomallei" "10ug" 29 29 FALSE +"EUCAST 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "B. pseudomallei" 2 2 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 50 21 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 0.001 4 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Gram-negative anaerobes" 2 4 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Gram-positive anaerobes" 2 4 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" 2 2 FALSE +"EUCAST 2021" "DISK" "B_MRGNL" "Morganella" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 19 FALSE +"EUCAST 2021" "MIC" "B_MRGNL" "Morganella" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2021" "DISK" "B_MRGNL_MRGN_MRGN" "Morganella morganii morganii" 1 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2021" "MIC" "B_MRGNL_MRGN_MRGN" "Morganella morganii morganii" 1 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2021" "DISK" "B_PROTS" "Proteus" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2021" "MIC" "B_PROTS" "Proteus" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2021" "DISK" "B_PRVDN" "Providencia" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2021" "MIC" "B_PRVDN" "Providencia" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 50 20 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 0.001 4 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "S. pneumoniae" 2 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "ISV" "Isavuconazole" "Aspergillus" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_FLAVS" "Aspergillus flavus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "KAN" "Kanamycin" "Staphs" 8 8 FALSE +"EUCAST 2021" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "KAN" "Kanamycin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "KAN" "Kanamycin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LMU" "Lefamulin" "Staphs" "5ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LMU" "Lefamulin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LMU" "Lefamulin" "S. pneumoniae" "5ug" 12 12 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LMU" "Lefamulin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_BCLLS" "Bacillus" 3 "LNZ" "Linezolid" "Bacillus sp." "10ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_BCLLS" "Bacillus" 3 "LNZ" "Linezolid" "Bacillus sp." 2 2 FALSE +"EUCAST 2021" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 21 21 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 19 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "S. pneumoniae" "10ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "S. pneumoniae" 2 2 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 2 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 23 19 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 23 20 FALSE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 0.5 1 FALSE +"EUCAST 2021" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2021" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2021" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" 0.5 1 FALSE +"EUCAST 2021" "DISK" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "Bacillus sp." "5ug" 50 23 FALSE +"EUCAST 2021" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "Bacillus sp." 0.001 1 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2021" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" "5ug" 29 29 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 50 22 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 0.001 1 FALSE +"EUCAST 2021" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 50 24 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 50 22 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LVX" "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 50 17 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 0.001 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "S. pneumoniae" "5ug" 50 16 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "S. pneumoniae" 0.001 2 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "UTI" "B_CTRBC" "Citrobacter" 3 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_CTRBC" "Citrobacter" 3 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "DISK" "UTI" "B_ENTRBC" "Enterobacter" 3 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ENTRBC" "Enterobacter" 3 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL" "Klebsiella" 3 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL" "Klebsiella" 3 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "DISK" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "DISK" "UTI" "B_RLTLL" "Raoultella" 3 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_RLTLL" "Raoultella" 3 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2021" "DISK" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2021" "DISK" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 22 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2021" "DISK" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "MEM" "Meropenem" "A. xylosoxidans" "10ug" 26 20 FALSE +"EUCAST 2021" "MIC" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "MEM" "Meropenem" "A. xylosoxidans" 1 4 FALSE +"EUCAST 2021" "DISK" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "MEM" "Meropenem" "A. xylosoxidans" "10ug" 26 20 FALSE +"EUCAST 2021" "MIC" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "MEM" "Meropenem" "A. xylosoxidans" 1 4 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2021" "DISK" "Meningitis" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 21 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2021" "DISK" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" "10ug" 31 31 FALSE +"EUCAST 2021" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_BCLLS" "Bacillus" 3 "MEM" "Meropenem" "Bacillus sp." "10ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_BCLLS" "Bacillus" 3 "MEM" "Meropenem" "Bacillus sp." 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "MEM" "Meropenem" "B. pseudomallei" "10ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "MEM" "Meropenem" "B. pseudomallei" 2 2 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Gram-negative anaerobes" 2 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Gram-positive anaerobes" 2 8 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 2 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" "10ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" 0.032 0.032 FALSE +"EUCAST 2021" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "L. monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "L. monocytogenes" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" "10ug" 33 33 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2021" "DISK" "Meningitis" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 24 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 2 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "S. pneumoniae" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "S. pneumoniae" 2 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEV" "Meropenem/vaborbactam" "Pseudo" 8 8 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "MEV" "Meropenem/vaborbactam" "PK/PD" 8 8 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C. difficile" 4 1024 FALSE +"EUCAST 2021" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" "5ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 19 19 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "S. pneumoniae" "5ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2021" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 0.002 2 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" "30ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" 1 1 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" "30ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" 1 1 FALSE +"EUCAST 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 1 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "S. pneumoniae" "30ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "S. pneumoniae" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Gram-negative anaerobes" 4 4 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Gram-positive anaerobes" 4 4 FALSE +"EUCAST 2021" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2021" "DISK" "Screen" "B_HMPHL" "Haemophilus" 3 "NAL" "Nalidixic acid" "H. influenzae" "30ug" 23 23 FALSE +"EUCAST 2021" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. catarrhalis" "30ug" 23 23 FALSE +"EUCAST 2021" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2021" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2021" "DISK" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" "100ug" 16 16 FALSE +"EUCAST 2021" "MIC" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" 16 16 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2021" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2021" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2021" "DISK" "UTI" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2021" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 22 TRUE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 0.5 TRUE +"EUCAST 2021" "DISK" "B_AERCC" "Aerococcus" 3 "NOR" "Norfloxacin" "Aerococcus" "10ug" 17 17 FALSE +"EUCAST 2021" "DISK" "Screen" "B_BCLLS" "Bacillus" 3 "NOR" "Norfloxacin" "Bacillus sp." "10ug" 21 21 FALSE +"EUCAST 2021" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "S. pneumoniae" "10ug" 10 10 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NTR" "Nitroxoline" "Enterobacteriaceae" "30ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NTR" "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 24 22 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" "5ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ORI" "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "ORI" "Oritavancin" "PK/PD" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STPHY_CGLN" "Staphylococcus coagulans" 2 "OXA" "Oxacillin" "Staphs" "1ug" 20 20 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Staphs" "1ug" 20 20 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Staphs" "1ug" 20 20 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "S. pneumoniae" "1ug" 20 20 FALSE +"EUCAST 2021" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2021" "DISK" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" "1 unit" 21 21 FALSE +"EUCAST 2021" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2021" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Gram-negative anaerobes" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Gram-positive anaerobes" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "Screen" "B_HMPHL" "Haemophilus" 3 "PEN" "Benzylpenicillin" "H. influenzae" "1 unit" 12 12 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" "1 unit" 25 25 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "L. monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "L. monocytogenes" 1 1 FALSE +"EUCAST 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "P. multocida" "1 unit" 17 17 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "P. multocida" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2021" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "Non-meningitis" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2021" "DISK" "Meningitis" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 19 19 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "S. pneumoniae" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "S. pneumoniae" 0.064 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2021" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2021" "MIC" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 1024 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Gram-negative anaerobes" 16 16 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Gram-positive anaerobes" 8 16 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 50 18 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 0.001 16 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2021" "DISK" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" "5ug" 25 25 FALSE +"EUCAST 2021" "MIC" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C. difficile" 0.004 1024 FALSE +"EUCAST 2021" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2021" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2021" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2021" "DISK" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" "5ug" 18 18 FALSE +"EUCAST 2021" "MIC" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" 1 1 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" "5ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 15 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "S. pneumoniae" "5ug" 22 17 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "S. pneumoniae" 0.125 0.5 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "S. pneumoniae" 0.5 1 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Gram-negative anaerobes" 4 8 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Gram-positive anaerobes" 4 8 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "H. influenzae" 1 1 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. catarrhalis" 1 1 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2021" "DISK" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "SXT" "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" "1.25ug/23.75ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "SXT" "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "SXT" "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" "1.25ug/23.75ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "SXT" "Trimethoprim/sulfamethoxazole" "A. xylosoxidans" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2021" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" "1.25ug/23.75ug" 19 16 FALSE +"EUCAST 2021" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" 2 4 FALSE +"EUCAST 2021" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "B. pseudomallei" "1.25ug/23.75ug" 50 17 FALSE +"EUCAST 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "B. pseudomallei" 0.001 4 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" "1.25ug/23.75ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "L. monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2021" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "L. monocytogenes" 0.064 0.064 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2021" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2021" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 50 16 FALSE +"EUCAST 2021" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 0.001 4 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "S. pneumoniae" "1.25ug/23.75ug" 13 10 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "S. pneumoniae" 1 2 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 20 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Gram-negative anaerobes" 8 16 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Gram-positive anaerobes" 8 16 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 50 18 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 0.001 16 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2021" "DISK" "Screen" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "B. pseudomallei" "30ug" 50 23 FALSE +"EUCAST 2021" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "TCY" "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "TCY" "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE +"EUCAST 2021" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "TCY" "Tetracycline" "C. jejuni, C. coli" "30ug" 30 30 FALSE +"EUCAST 2021" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "TCY" "Tetracycline" "C. jejuni, C. coli" 2 2 FALSE +"EUCAST 2021" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2021" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2021" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" "30ug" 25 22 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" 1 2 FALSE +"EUCAST 2021" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" "30ug" 28 28 FALSE +"EUCAST 2021" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" "30ug" 28 25 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 2 2 FALSE +"EUCAST 2021" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "S. pneumoniae" "30ug" 25 22 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "S. pneumoniae" 1 2 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "S. pneumoniae" "30ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "S. pneumoniae" 2 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL" "Klebsiella" 3 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL" "Klebsiella" 3 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL_GRNL" "Klebsiella granulomatis" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL_GRNL" "Klebsiella granulomatis" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL_OXYT" "Klebsiella oxytoca" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL_OXYT" "Klebsiella oxytoca" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL_PNMN_OZAN" "Klebsiella pneumoniae ozaenae" 1 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL_PNMN_OZAN" "Klebsiella pneumoniae ozaenae" 1 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL_PNMN_RHNS" "Klebsiella pneumoniae rhinoscleromatis" 1 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL_PNMN_RHNS" "Klebsiella pneumoniae rhinoscleromatis" 1 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL_QSPN" "Klebsiella quasipneumoniae" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL_QSPN" "Klebsiella quasipneumoniae" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_KLBSL_VRCL" "Klebsiella variicola" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_KLBSL_VRCL" "Klebsiella variicola" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "DISK" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "TEM" "Temocillin" "Enterobacteriaceae" "30ug" 50 17 TRUE +"EUCAST 2021" "MIC" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "TEM" "Temocillin" "Enterobacteriaceae" 0.001 16 TRUE +"EUCAST 2021" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C. difficile" 0.25 1024 FALSE +"EUCAST 2021" "DISK" "B_CTRBC_KOSR" "Citrobacter koseri" 2 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_CTRBC_KOSR" "Citrobacter koseri" 2 "TGC" "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_ENTRC_FACM" "Enterococcus faecium" 2 "TGC" "Tigecycline" "Enterococcus" "15ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "TGC" "Tigecycline" "Enterococcus" "15ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "TGC" "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 19 19 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 19 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 20 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Gram-negative anaerobes" 16 16 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Gram-positive anaerobes" 8 16 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 50 18 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 0.001 16 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "H. influenzae" 8 8 FALSE +"EUCAST 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "S. pneumoniae" "15ug" 23 20 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "S. pneumoniae" 0.25 0.5 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 15 15 TRUE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 4 4 TRUE +"EUCAST 2021" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2021" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2021" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 14 14 TRUE +"EUCAST 2021" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 4 4 TRUE +"EUCAST 2021" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 16 16 FALSE +"EUCAST 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 16 16 TRUE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 2 TRUE +"EUCAST 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2021" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 TRUE +"EUCAST 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2021" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 TRUE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 18 18 FALSE +"EUCAST 2021" "DISK" "UTI" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 18 18 TRUE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 2 2 FALSE +"EUCAST 2021" "MIC" "UTI" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 2 2 TRUE +"EUCAST 2021" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" "2ug" 21 21 FALSE +"EUCAST 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" "2ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "TZD" "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_CNST" "Streptococcus constellatus" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STRPT_CNST" "Streptococcus constellatus" 2 "TZD" "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_STRPT_INTR" "Streptococcus intermedius" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2021" "MIC" "B_STRPT_INTR" "Streptococcus intermedius" 2 "TZD" "Tedizolid" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 20 FALSE +"EUCAST 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2021" "DISK" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "TZP" "Piperacillin/tazobactam" "A. xylosoxidans" "30ug/6ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_ACHRMB_DNTR" "Achromobacter denitrificans" 2 "TZP" "Piperacillin/tazobactam" "A. xylosoxidans" 4 4 FALSE +"EUCAST 2021" "DISK" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "TZP" "Piperacillin/tazobactam" "A. xylosoxidans" "30ug/6ug" 26 26 FALSE +"EUCAST 2021" "MIC" "B_ACHRMB_XYLS" "Achromobacter xylosoxidans" 2 "TZP" "Piperacillin/tazobactam" "A. xylosoxidans" 4 4 FALSE +"EUCAST 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Gram-negative anaerobes" 8 16 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Gram-positive anaerobes" 8 16 FALSE +"EUCAST 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "H. influenzae" "30ug/6ug" 27 27 FALSE +"EUCAST 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2021" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 50 18 FALSE +"EUCAST 2021" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 0.001 16 FALSE +"EUCAST 2021" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2021" "DISK" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" "5ug" 16 16 FALSE +"EUCAST 2021" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" 1 1 FALSE +"EUCAST 2021" "DISK" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "Bacillus sp." "5ug" 10 10 FALSE +"EUCAST 2021" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "Bacillus sp." 2 2 FALSE +"EUCAST 2021" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2021" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2021" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2021" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Gram-positive anaerobes" 2 2 FALSE +"EUCAST 2021" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2021" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "S. pneumoniae" "5ug" 16 16 FALSE +"EUCAST 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "S. pneumoniae" 2 2 FALSE +"EUCAST 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2021" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2021" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "VOR" "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2020" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2020" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2020" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "B. pseudomallei" "20ug/10ug" 50 22 FALSE +"EUCAST 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2020" "DISK" "Intravenous" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 15 15 FALSE +"EUCAST 2020" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 50 15 FALSE +"EUCAST 2020" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE +"EUCAST 2020" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 0.001 2 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE +"EUCAST 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2020" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Pneumo" 0.5 1 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 18 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 19 FALSE +"EUCAST 2020" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 19 TRUE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 8 FALSE +"EUCAST 2020" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 8 TRUE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 15 15 FALSE +"EUCAST 2020" "DISK" "UTI" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 15 15 TRUE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 16 16 FALSE +"EUCAST 2020" "MIC" "UTI" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 16 16 TRUE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 8 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 8 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 1 1 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2020" "DISK" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" "2ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" "2ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" 1 1 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMP" "Ampicillin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "Intravenous" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2020" "MIC" "Intravenous" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2020" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" "2ug" 22 16 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" 0.5 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2020" "MIC" "Oral" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 2 2 FALSE +"EUCAST 2020" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 0.001 2 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMX" "Amoxicillin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2020" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Pneumo" 0.5 1 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 0.002 4 FALSE +"EUCAST 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 26 21 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2020" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 29 26 FALSE +"EUCAST 2020" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 1 4 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 50 18 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 0.001 16 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "H. influenzae" 4 4 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AZM" "Azithromycin" "Kingella" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_MYCBC_TBRC" "Mycobacterium tuberculosis" 2 "BDQ" "Bedaquiline" "M. tuberculosis" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "BPR" "Ceftobiprole" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" "5ug" 17 17 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "BPR" "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2020" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" "10ug" 24 21 FALSE +"EUCAST 2020" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" 1 4 FALSE +"EUCAST 2020" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "B. pseudomallei" "10ug" 50 18 FALSE +"EUCAST 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 50 17 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 0.001 8 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" "30ug" 50 28 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" 0.001 0.5 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" "5ug" 21 18 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2020" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CHL" "Chloramphenicol" "B. pseudomallei" "30ug" 50 22 FALSE +"EUCAST 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CHL" "Chloramphenicol" "B. pseudomallei" 0.001 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Gramneg" 8 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Grampos" 8 8 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" 2 2 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" "30ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" 2 2 FALSE +"EUCAST 2020" "MIC" "Meningitis" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 2 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" "30ug" 21 21 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" 8 8 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 25 22 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 50 21 FALSE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 0.001 1 FALSE +"EUCAST 2020" "DISK" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" "5ug" 21 21 FALSE +"EUCAST 2020" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2020" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2020" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2020" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2020" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" "5ug" 31 31 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 50 26 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.001 0.5 FALSE +"EUCAST 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 50 21 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 50 24 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" "2ug" 19 19 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "H. influenzae" 32 32 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CLR" "Clarithromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 2 2 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" "10ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CPT" "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2020" "DISK" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2020" "DISK" "Non-pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 17 FALSE +"EUCAST 2020" "MIC" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2020" "MIC" "Non-pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 25 22 FALSE +"EUCAST 2020" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" "30ug" 32 32 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" "30ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" "30ug" 24 21 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" 1 2 FALSE +"EUCAST 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Pneumo" 0.5 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" "30ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" 1 1 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" "5ug" 27 27 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" "5ug" 27 27 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" "5ug" 20 17 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" 1 2 FALSE +"EUCAST 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Pneumo" 0.5 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2020" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 50 19 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 19 19 TRUE +"EUCAST 2020" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 0.001 8 FALSE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2020" "DISK" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" "30ug" 27 25 FALSE +"EUCAST 2020" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" "30ug" 50 27 FALSE +"EUCAST 2020" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 1 2 FALSE +"EUCAST 2020" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 0.001 1 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" "30ug" 29 29 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 21 18 FALSE +"EUCAST 2020" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2020" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 4 8 FALSE +"EUCAST 2020" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 0.001 4 FALSE +"EUCAST 2020" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.5 1 FALSE +"EUCAST 2020" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" "10ug" 13 13 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Pseudo" "10ug/4ug" 17 17 FALSE +"EUCAST 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Pseudo" 8 8 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CZA" "Ceftazidime/avibactam" "PK/PD" 8 8 FALSE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Enterobacteriaceae" 0.001 4 TRUE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZO" "Cefazolin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" "30ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2020" "MIC" "Pneumonia" "B_HMPHL" "Haemophilus" 3 "CZT" "Ceftolozane/tazobactam" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" "30ug/10ug" 24 24 FALSE +"EUCAST 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" 4 4 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "CZT" "Ceftolozane/tazobactam" "PK/PD" 4 4 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "DAL" "Dalbavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "DAL" "Dalbavancin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C. difficile" 4 1024 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2020" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "DFX" "Delafloxacin" "Enterobacteriaceae" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "DFX" "Delafloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "DFX" "Delafloxacin" "Strep A, B, C, G" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "B_STRPT_CNST" "Streptococcus constellatus" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "B_STRPT_INTR" "Streptococcus intermedius" 2 "DFX" "Delafloxacin" "Viridans strept" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "B_MYCBC_TBRC" "Mycobacterium tuberculosis" 2 "DLM" "Delamanid" "M. tuberculosis" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "B. pseudomallei" 0.001 2 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "DOX" "Doxycycline" "H. influenzae" 1 2 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "DOX" "Doxycycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Pneumo" 1 2 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_ENTRC_FACM" "Enterococcus faecium" 2 "ERV" "Eravacycline" "Enterococcus" "20ug" 24 24 FALSE +"EUCAST 2020" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "ERV" "Eravacycline" "Enterococcus" "20ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "ERV" "Eravacycline" "Enterobacteriaceae" "20ug" 17 17 FALSE +"EUCAST 2020" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "ERV" "Eravacycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ERV" "Eravacycline" "Staphs" "20ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ERV" "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ERV" "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERV" "Eravacycline" "Viridans strept" "20ug" 17 17 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERV" "Eravacycline" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 24 24 FALSE +"EUCAST 2020" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE +"EUCAST 2020" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "ERY" "Erythromycin" "H. influenzae" 16 16 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" "15ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" "15ug" 22 19 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Anaerobes, Gramneg" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Anaerobes, Grampos" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" "10ug" 23 23 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 27 24 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2020" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" "30ug" 27 24 FALSE +"EUCAST 2020" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" 1 4 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" "30ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" 4 4 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 50 21 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 0.001 8 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Pneumo" 1 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2020" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.002 32 FALSE +"EUCAST 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "FLU" "Fluconazole" "PK/PD" 2 4 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2020" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 FALSE +"EUCAST 2020" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 TRUE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2020" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2020" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2020" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2020" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 20 20 FALSE +"EUCAST 2020" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" 8 8 FALSE +"EUCAST 2020" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C. difficile" 2 1024 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 17 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 17 TRUE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 2 TRUE +"EUCAST 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2020" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 TRUE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2020" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 TRUE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IMR" "Imipenem/relebactam" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "IMR" "Imipenem/relebactam" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IMR" "Imipenem/relebactam" "Anaerobes, Gramneg" 2 2 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IMR" "Imipenem/relebactam" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Pseudo" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IMR" "Imipenem/relebactam" "Viridans strept" 2 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "IMR" "Imipenem/relebactam" "PK/PD" 2 2 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 17 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 24 21 FALSE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2020" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "B. pseudomallei" "10ug" 29 29 FALSE +"EUCAST 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "B. pseudomallei" 2 2 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 50 21 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 0.001 4 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Anaerobes, Gramneg" 2 4 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Anaerobes, Grampos" 2 4 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" 2 2 FALSE +"EUCAST 2020" "DISK" "B_MRGNL_MRGN_MRGN" "Morganella morganii morganii" 1 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2020" "MIC" "B_MRGNL_MRGN_MRGN" "Morganella morganii morganii" 1 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2020" "DISK" "B_PROTS" "Proteus" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2020" "MIC" "B_PROTS" "Proteus" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2020" "DISK" "B_PRVDN" "Providencia" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2020" "MIC" "B_PRVDN" "Providencia" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.001 4 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 50 20 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 0.001 4 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Pneumo" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "ISV" "Isavuconazole" "Aspergillus" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_FLAVS" "Aspergillus flavus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "KAN" "Kanamycin" "Staphs" 8 8 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "KAN" "Kanamycin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "KAN" "Kanamycin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2020" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 21 21 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 19 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" "10ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" 2 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 2 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 23 19 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 23 20 FALSE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 0.5 1 FALSE +"EUCAST 2020" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2020" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2020" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" 0.5 1 FALSE +"EUCAST 2020" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2020" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2020" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" "5ug" 29 29 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 50 22 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 0.001 1 FALSE +"EUCAST 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 50 22 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 50 24 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 50 17 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 0.001 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" "5ug" 50 16 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" 0.001 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2020" "DISK" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" "10ug" 31 31 FALSE +"EUCAST 2020" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "MEM" "Meropenem" "B. pseudomallei" "10ug" 24 24 FALSE +"EUCAST 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "MEM" "Meropenem" "B. pseudomallei" 2 2 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2020" "DISK" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2020" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 2 2 FALSE +"EUCAST 2020" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" "10ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" 0.032 0.032 FALSE +"EUCAST 2020" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" "10ug" 33 33 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2020" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEV" "Meropenem/vaborbactam" "Pseudo" 8 8 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "MEV" "Meropenem/vaborbactam" "PK/PD" 8 8 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C. difficile" 4 1024 FALSE +"EUCAST 2020" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" "5ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 19 19 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" "5ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2020" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 0.002 2 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" "30ug" 24 24 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" 1 1 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" "30ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" 1 1 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 1 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 23 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 23 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" "30ug" 24 24 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2020" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2020" "DISK" "Screen" "B_HMPHL" "Haemophilus" 3 "NAL" "Nalidixic acid" "H. influenzae" "30ug" 23 23 FALSE +"EUCAST 2020" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. catarrhalis" "30ug" 23 23 FALSE +"EUCAST 2020" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2020" "DISK" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" "100ug" 16 16 FALSE +"EUCAST 2020" "MIC" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" 16 16 FALSE +"EUCAST 2020" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2020" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2020" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2020" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2020" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2020" "DISK" "UTI" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2020" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2020" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 22 TRUE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 0.5 TRUE +"EUCAST 2020" "DISK" "B_AERCC" "Aerococcus" 3 "NOR" "Norfloxacin" "Aerococcus" "10ug" 17 17 FALSE +"EUCAST 2020" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2020" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2020" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2020" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "Pneumo" "10ug" 10 10 FALSE +"EUCAST 2020" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NTR" "Nitroxoline" "Enterobacteriaceae" "30ug" 15 15 TRUE +"EUCAST 2020" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "NTR" "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 24 22 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" "5ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OFX" "Ofloxacin" "Staphs" "5ug" 50 20 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OFX" "Ofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OFX" "Ofloxacin" "Staphs" "5ug" 50 24 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OFX" "Ofloxacin" "Staphs" 0.001 1 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "ORI" "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "ORI" "Oritavancin" "PK/PD" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2020" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Pneumo" "1ug" 20 20 FALSE +"EUCAST 2020" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2020" "DISK" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" "1 unit" 21 21 FALSE +"EUCAST 2020" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2020" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Gramneg" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Grampos" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "Screen" "B_HMPHL" "Haemophilus" 3 "PEN" "Benzylpenicillin" "H. influenzae" "1 unit" 12 12 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" "1 unit" 25 25 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE +"EUCAST 2020" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2020" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE +"EUCAST 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2020" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2020" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 17 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 50 18 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 0.001 16 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2020" "DISK" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" "5ug" 25 25 FALSE +"EUCAST 2020" "MIC" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C. difficile" 0.004 1024 FALSE +"EUCAST 2020" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2020" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2020" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2020" "DISK" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" "5ug" 18 18 FALSE +"EUCAST 2020" "MIC" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" 1 1 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" "5ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 15 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" "5ug" 22 17 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" 0.125 0.5 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "Pneumo" 0.5 1 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "H. influenzae" 1 1 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. catarrhalis" 1 1 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2020" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" "1.25ug/23.75ug" 19 16 FALSE +"EUCAST 2020" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" 2 4 FALSE +"EUCAST 2020" "DISK" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "B. pseudomallei" "1.25ug/23.75ug" 50 17 FALSE +"EUCAST 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "B. pseudomallei" 0.001 4 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" "1.25ug/23.75ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2020" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 50 16 FALSE +"EUCAST 2020" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 0.001 4 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" "1.25ug/23.75ug" 13 10 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" 1 2 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 20 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 50 18 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 0.001 16 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2020" "DISK" "Screen" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "B. pseudomallei" "30ug" 50 23 FALSE +"EUCAST 2020" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2020" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2020" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2020" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2020" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2020" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2020" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" "30ug" 25 22 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" 1 2 FALSE +"EUCAST 2020" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" "30ug" 28 28 FALSE +"EUCAST 2020" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" "30ug" 28 25 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 2 2 FALSE +"EUCAST 2020" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" "30ug" 25 22 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" 1 2 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" "30ug" 17 17 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" 2 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2020" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C. difficile" 0.25 1024 FALSE +"EUCAST 2020" "DISK" "B_CTRBC_KOSR" "Citrobacter koseri" 2 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_CTRBC_KOSR" "Citrobacter koseri" 2 "TGC" "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_ENTRC_FACM" "Enterococcus faecium" 2 "TGC" "Tigecycline" "Enterococcus" "15ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "TGC" "Tigecycline" "Enterococcus" "15ug" 20 20 FALSE +"EUCAST 2020" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "TGC" "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 19 19 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 19 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 20 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 50 18 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 0.001 16 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "H. influenzae" 8 8 FALSE +"EUCAST 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" "15ug" 23 20 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 15 15 TRUE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 4 4 TRUE +"EUCAST 2020" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2020" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2020" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 14 14 TRUE +"EUCAST 2020" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 4 4 TRUE +"EUCAST 2020" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 17 FALSE +"EUCAST 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 17 TRUE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 2 TRUE +"EUCAST 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2020" "DISK" "UTI" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 TRUE +"EUCAST 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2020" "MIC" "UTI" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 TRUE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 18 18 FALSE +"EUCAST 2020" "DISK" "UTI" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 18 18 TRUE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 2 2 FALSE +"EUCAST 2020" "MIC" "UTI" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 2 2 TRUE +"EUCAST 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2020" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" "2ug" 21 21 FALSE +"EUCAST 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" "2ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2020" "DISK" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STRPT_ANGN" "Streptococcus anginosus" 2 "TZD" "Tedizolid" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_STRPT_CNST" "Streptococcus constellatus" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STRPT_CNST" "Streptococcus constellatus" 2 "TZD" "Tedizolid" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_STRPT_INTR" "Streptococcus intermedius" 2 "TZD" "Tedizolid" "Viridans strept" "2ug" 18 18 FALSE +"EUCAST 2020" "MIC" "B_STRPT_INTR" "Streptococcus intermedius" 2 "TZD" "Tedizolid" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 17 FALSE +"EUCAST 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "H. influenzae" "30ug/6ug" 27 27 FALSE +"EUCAST 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2020" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 50 18 FALSE +"EUCAST 2020" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 0.001 16 FALSE +"EUCAST 2020" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2020" "DISK" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" "5ug" 16 16 FALSE +"EUCAST 2020" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" 1 1 FALSE +"EUCAST 2020" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2020" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2020" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2020" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2020" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2020" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2020" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" 2 2 FALSE +"EUCAST 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2020" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2020" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "VOR" "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2019" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2019" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 15 15 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE +"EUCAST 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2019" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Pneumo" 0.5 1 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 15 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 17 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 16 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 18 15 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 8 16 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 16 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 8 16 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2019" "DISK" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" "2ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" "2ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" 1 1 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMP" "Ampicillin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2019" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" "2ug" 22 16 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" 0.5 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2019" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 2 2 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMX" "Amoxicillin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2019" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Pneumo" 0.5 1 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2019" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 0.002 4 FALSE +"EUCAST 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 26 21 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2019" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 29 26 FALSE +"EUCAST 2019" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 1 4 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 16 16 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "H. influenzae" 4 4 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AZM" "Azithromycin" "Kingella" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "BPR" "Ceftobiprole" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" "5ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "BPR" "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2019" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" "10ug" 24 21 FALSE +"EUCAST 2019" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" 1 4 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 8 8 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" "30ug" 50 28 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" 0.032 0.5 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" "5ug" 21 18 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Gramneg" 8 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Grampos" 8 8 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" 2 2 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" "30ug" 30 30 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" 2 2 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 2 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" "30ug" 21 21 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" 8 8 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 25 22 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 50 21 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 0.064 1 FALSE +"EUCAST 2019" "DISK" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" "5ug" 21 21 FALSE +"EUCAST 2019" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2019" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2019" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2019" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2019" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" "5ug" 31 31 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 21 21 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" "2ug" 19 19 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "H. influenzae" 32 32 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CLR" "Clarithromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 4 4 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" "10ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CPT" "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2019" "DISK" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2019" "DISK" "Non-pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 17 FALSE +"EUCAST 2019" "MIC" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2019" "MIC" "Non-pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 25 22 FALSE +"EUCAST 2019" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" "30ug" 32 32 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" "30ug" 30 30 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" "30ug" 24 21 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" 1 2 FALSE +"EUCAST 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Pneumo" 0.5 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" "30ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" 1 1 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" "5ug" 27 27 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" "5ug" 27 27 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" "5ug" 20 17 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" 1 2 FALSE +"EUCAST 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Pneumo" 0.5 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2019" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2019" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2019" "DISK" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" "30ug" 27 25 FALSE +"EUCAST 2019" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" "30ug" 50 27 FALSE +"EUCAST 2019" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 1 2 FALSE +"EUCAST 2019" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 0.125 1 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" "30ug" 29 29 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 21 18 FALSE +"EUCAST 2019" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2019" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 4 8 FALSE +"EUCAST 2019" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 0.125 4 FALSE +"EUCAST 2019" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.5 1 FALSE +"EUCAST 2019" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" "10ug" 13 13 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "CZA" "Ceftazidime/avibactam" "Pseudo" "10ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "CZA" "Ceftazidime/avibactam" "Pseudo" 8 8 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CZA" "Ceftazidime/avibactam" "PK/PD" 8 8 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZO" "Cefazolin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" "30ug" 23 23 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" "30ug" 24 24 FALSE +"EUCAST 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" 4 4 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "CZT" "Ceftolozane/tazobactam" "PK/PD" 4 4 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "DAL" "Dalbavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "DAL" "Dalbavancin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C. difficile" 4 1024 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "DOX" "Doxycycline" "H. influenzae" 1 2 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "DOX" "Doxycycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Pneumo" 1 2 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ERV" "Eravacycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "ERV" "Eravacycline" "Enterococcus" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ERV" "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ERV" "Eravacycline" "Staphs" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERV" "Eravacycline" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 24 24 FALSE +"EUCAST 2019" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE +"EUCAST 2019" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE +"EUCAST 2019" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "ERY" "Erythromycin" "H. influenzae" 16 16 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" "15ug" 20 20 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" "15ug" 22 19 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Anaerobes, Gramneg" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Anaerobes, Grampos" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" "10ug" 23 23 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 27 24 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2019" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" "30ug" 27 24 FALSE +"EUCAST 2019" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" 1 4 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" "30ug" 20 20 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" 4 4 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 21 21 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 8 8 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Pneumo" 1 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2019" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.002 32 FALSE +"EUCAST 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "FLU" "Fluconazole" "PK/PD" 2 4 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2019" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 FALSE +"EUCAST 2019" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 TRUE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2019" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2019" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2019" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2019" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 20 20 FALSE +"EUCAST 2019" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" 8 8 FALSE +"EUCAST 2019" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C. difficile" 2 1024 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." "10ug" 23 23 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" "10ug" 15 15 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 2 4 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 17 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 24 21 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 21 18 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 4 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Anaerobes, Gramneg" 2 4 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Anaerobes, Grampos" 2 4 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" 2 2 FALSE +"EUCAST 2019" "DISK" "B_MRGNL_MRGN_MRGN" "Morganella morganii morganii" 1 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2019" "MIC" "B_MRGNL_MRGN_MRGN" "Morganella morganii morganii" 1 "IPM" "Imipenem" "Enterobacteriaceae" 0.125 4 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2019" "DISK" "B_PROTS" "Proteus" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2019" "MIC" "B_PROTS" "Proteus" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.125 4 FALSE +"EUCAST 2019" "DISK" "B_PRVDN" "Providencia" 3 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 50 17 FALSE +"EUCAST 2019" "MIC" "B_PRVDN" "Providencia" 3 "IPM" "Imipenem" "Enterobacteriaceae" 0.125 4 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 20 20 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 4 4 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Pneumo" 2 2 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "ISV" "Isavuconazole" "Aspergillus" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "ISV" "Isavuconazole" "Aspergillus" 1 1 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_FLAVS" "Aspergillus flavus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_NDLN" "Aspergillus nidulans" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "KAN" "Kanamycin" "Staphs" 8 8 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "KAN" "Kanamycin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "KAN" "Kanamycin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 19 19 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 21 21 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 16 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 4 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" "10ug" 22 19 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" 2 4 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 4 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 23 19 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 0.5 1 FALSE +"EUCAST 2019" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2019" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2019" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" 0.5 1 FALSE +"EUCAST 2019" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2019" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2019" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" "5ug" 29 29 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 1 1 FALSE +"EUCAST 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" 2 2 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2019" "DISK" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" "10ug" 31 31 FALSE +"EUCAST 2019" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2019" "DISK" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2019" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 2 2 FALSE +"EUCAST 2019" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" "10ug" 30 30 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" 0.032 0.032 FALSE +"EUCAST 2019" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" "10ug" 33 33 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 2 2 FALSE +"EUCAST 2019" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEV" "Meropenem/vaborbactam" "Pseudo" 8 8 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "MEV" "Meropenem/vaborbactam" "PK/PD" 8 8 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C. difficile" 4 1024 FALSE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" "5ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 19 19 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" "5ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2019" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 0.002 2 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" "30ug" 24 21 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" 1 2 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" "30ug" 25 22 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" "30ug" 24 21 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" 0.5 1 FALSE +"EUCAST 2019" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2019" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2019" "DISK" "Screen" "B_HMPHL" "Haemophilus" 3 "NAL" "Nalidixic acid" "H. influenzae" "30ug" 23 23 FALSE +"EUCAST 2019" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. catarrhalis" "30ug" 23 23 FALSE +"EUCAST 2019" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" "10ug" 15 12 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." "10ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" "10ug" 12 12 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2019" "DISK" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" "100ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" 16 16 FALSE +"EUCAST 2019" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2019" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2019" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2019" "DISK" "UTI" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2019" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2019" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_AERCC" "Aerococcus" 3 "NOR" "Norfloxacin" "Aerococcus" "10ug" 17 17 FALSE +"EUCAST 2019" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2019" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2019" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2019" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "Pneumo" "10ug" 10 10 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NTR" "Nitroxoline" "Enterobacteriaceae" "30ug" 15 15 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NTR" "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 24 22 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" "5ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OFX" "Ofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OFX" "Ofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "ORI" "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "ORI" "Oritavancin" "PK/PD" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2019" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Pneumo" "1ug" 20 20 FALSE +"EUCAST 2019" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2019" "DISK" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" "1 unit" 21 21 FALSE +"EUCAST 2019" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Gramneg" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Grampos" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "Screen" "B_HMPHL" "Haemophilus" 3 "PEN" "Benzylpenicillin" "H. influenzae" "1 unit" 12 12 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" "1 unit" 25 25 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE +"EUCAST 2019" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE +"EUCAST 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2019" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 2 FALSE +"EUCAST 2019" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2019" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 17 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 16 16 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2019" "DISK" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" "5ug" 25 25 FALSE +"EUCAST 2019" "MIC" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C. difficile" 0.004 1024 FALSE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2019" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2019" "DISK" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" "5ug" 18 18 FALSE +"EUCAST 2019" "MIC" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" 1 1 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" "5ug" 20 20 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 15 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" "5ug" 22 17 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" 0.064 0.5 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "Pneumo" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "H. influenzae" 1 1 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. catarrhalis" 1 1 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2019" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" "1.25ug/23.75ug" 19 16 FALSE +"EUCAST 2019" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" 2 4 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" "1.25ug/23.75ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" "1.25ug/23.75ug" 13 10 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" 1 2 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 16 16 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2019" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2019" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" "30ug" 25 22 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" 1 2 FALSE +"EUCAST 2019" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" "30ug" 28 28 FALSE +"EUCAST 2019" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" "30ug" 28 25 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2019" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" "30ug" 25 22 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" 1 2 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" "30ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" 2 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C. difficile" 0.25 1024 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 19 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 16 16 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "H. influenzae" 8 8 FALSE +"EUCAST 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" "15ug" 23 20 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 18 15 TRUE +"EUCAST 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE +"EUCAST 2019" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2019" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2019" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 17 14 TRUE +"EUCAST 2019" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 2 4 TRUE +"EUCAST 2019" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2019" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 2 4 FALSE +"EUCAST 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 17 FALSE +"EUCAST 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "H. influenzae" "30ug/6ug" 27 27 FALSE +"EUCAST 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2019" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 18 18 FALSE +"EUCAST 2019" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 16 16 FALSE +"EUCAST 2019" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2019" "DISK" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" "5ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" 1 1 FALSE +"EUCAST 2019" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2019" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2019" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2019" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2019" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2019" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2019" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" 2 2 FALSE +"EUCAST 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2019" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2019" "MIC" "F_CANDD_DBLN" "Candida dubliniensis" 2 "VOR" "Voriconazole" "Candida" 0.064 0.25 FALSE +"EUCAST 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.25 FALSE +"EUCAST 2018" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2018" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2018" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2018" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2018" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2018" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2018" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 15 15 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE +"EUCAST 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 15 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 17 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 16 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 18 15 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 8 16 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 16 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 8 16 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2018" "DISK" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" "2ug" 26 26 FALSE +"EUCAST 2018" "MIC" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" 1 1 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H. influenzae" "2ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMP" "Ampicillin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2018" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" 0.5 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2018" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 2 2 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMX" "Amoxicillin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2018" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2018" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 0.002 4 FALSE +"EUCAST 2018" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 26 21 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2018" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 29 26 FALSE +"EUCAST 2018" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "Aeromonas" "30ug" 1 4 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 50 16 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 1 16 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "H. influenzae" 4 4 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AZM" "Azithromycin" "Kingella" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "N. gonorrhoeae" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "BPR" "Ceftobiprole" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" "5ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "BPR" "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2018" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" "10ug" 24 21 FALSE +"EUCAST 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "Aeromonas" 1 4 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 8 8 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" "30ug" 50 28 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" 0.032 0.5 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" "5ug" 21 18 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Gramneg" 8 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Grampos" 8 8 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" 2 2 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" "30ug" 30 30 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" 2 2 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 4 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" "30ug" 21 21 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" 8 8 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 26 24 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 21 21 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 1 1 FALSE +"EUCAST 2018" "DISK" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" "5ug" 21 21 FALSE +"EUCAST 2018" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2018" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "Aeromonas" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2018" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2018" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" "5ug" 31 31 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 26 26 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 21 21 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" "2ug" 19 19 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "H. influenzae" 32 32 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CLR" "Clarithromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 4 4 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H. influenzae" "10ug" 26 23 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CPT" "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2018" "DISK" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2018" "DISK" "Non-pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 17 FALSE +"EUCAST 2018" "MIC" "Pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2018" "MIC" "Non-pneumonia" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 2 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 25 22 FALSE +"EUCAST 2018" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H. influenzae" "30ug" 31 31 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" "30ug" 30 30 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" "30ug" 24 21 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" 1 2 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Pneumo" 0.5 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" 1 1 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H. influenzae" "30ug" 25 25 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H. influenzae" "5ug" 27 27 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" "5ug" 27 27 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" "5ug" 20 17 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" 1 2 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Pneumo" 0.5 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2018" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2018" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2018" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 1 2 FALSE +"EUCAST 2018" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 0.125 1 FALSE +"EUCAST 2018" "DISK" "Intravenous" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenzae" "30ug" 26 25 FALSE +"EUCAST 2018" "DISK" "Oral" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenzae" "30ug" 50 26 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" "30ug" 29 29 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 21 18 FALSE +"EUCAST 2018" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2018" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 4 8 FALSE +"EUCAST 2018" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 0.125 4 FALSE +"EUCAST 2018" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.5 1 FALSE +"EUCAST 2018" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" "10ug" 13 13 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "CZA" "Ceftazidime/avibactam" "Pseudo" "10ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "CZA" "Ceftazidime/avibactam" "Pseudo" 8 8 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CZA" "Ceftazidime/avibactam" "PK/PD" 8 8 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZO" "Cefazolin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" "30ug" 23 23 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" "30ug" 24 24 FALSE +"EUCAST 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Pseudo" 4 4 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "CZT" "Ceftolozane/tazobactam" "PK/PD" 4 4 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "DAL" "Dalbavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "DAL" "Dalbavancin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C. difficile" 4 1024 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" "10ug" 24 21 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." "10ug" 24 21 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." 1 2 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOR" "Doripenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "DOR" "Doripenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "H. influenzae" 1 1 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" "10ug" 30 30 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" 1 1 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" "10ug" 25 22 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" 1 2 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Pneumo" 1 1 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "DOR" "Doripenem" "PK/PD" 1 2 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "DOX" "Doxycycline" "H. influenzae" 1 2 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "DOX" "Doxycycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Pneumo" 1 2 FALSE +"EUCAST 2018" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 24 24 FALSE +"EUCAST 2018" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE +"EUCAST 2018" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE +"EUCAST 2018" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "ERY" "Erythromycin" "H. influenzae" 16 16 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" "15ug" 20 20 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2018" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" "15ug" 22 19 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 22 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 27 24 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2018" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" "30ug" 27 24 FALSE +"EUCAST 2018" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "Aeromonas" 1 4 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" "30ug" 20 20 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" 4 4 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 21 21 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 8 8 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Pneumo" 1 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2018" "MIC" "F_CANDD" "Candida" 3 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2018" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2018" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.002 32 FALSE +"EUCAST 2018" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2018" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2018" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 FALSE +"EUCAST 2018" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 TRUE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2018" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2018" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2018" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2018" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2018" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 20 20 FALSE +"EUCAST 2018" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" 8 8 FALSE +"EUCAST 2018" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C. difficile" 2 1024 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." "10ug" 23 23 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" "10ug" 15 15 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 2 4 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 23 17 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 21 18 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 4 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" 2 2 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 20 17 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 4 8 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Pneumo" 2 2 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2018" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "KAN" "Kanamycin" "Staphs" 8 8 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "KAN" "Kanamycin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "KAN" "Kanamycin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 19 19 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 21 21 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 16 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 4 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" "10ug" 22 19 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" 2 4 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 4 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 23 19 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 0.5 1 FALSE +"EUCAST 2018" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2018" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" "5ug" 27 24 FALSE +"EUCAST 2018" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "Aeromonas" 0.5 1 FALSE +"EUCAST 2018" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2018" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2018" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" "5ug" 29 29 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 1 1 FALSE +"EUCAST 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" 2 2 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2018" "DISK" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" "10ug" 31 31 FALSE +"EUCAST 2018" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2018" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 2 2 FALSE +"EUCAST 2018" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 0.25 1 FALSE +"EUCAST 2018" "DISK" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" "10ug" 30 30 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" 0.032 0.032 FALSE +"EUCAST 2018" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2018" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" "10ug" 33 33 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 2 2 FALSE +"EUCAST 2018" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 0.25 1 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C. difficile" 4 1024 FALSE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H. influenzae" "5ug" 28 28 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 25 25 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 28 28 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 19 19 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" "5ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2018" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2018" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 0.002 2 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" 1 2 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H. influenzae" "30ug" 24 21 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" "30ug" 25 22 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" "30ug" 24 21 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" 0.5 1 FALSE +"EUCAST 2018" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2018" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2018" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "NAL" "Nalidixic acid" "H. influenzae" "30ug" 23 23 FALSE +"EUCAST 2018" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. catarrhalis" "30ug" 23 23 FALSE +"EUCAST 2018" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" "10ug" 15 12 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." "10ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" "10ug" 12 12 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2018" "DISK" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" "100ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" 16 16 FALSE +"EUCAST 2018" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2018" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2018" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2018" "DISK" "UTI" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2018" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2018" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_AERCC" "Aerococcus" 3 "NOR" "Norfloxacin" "Aerococcus" "10ug" 17 17 FALSE +"EUCAST 2018" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2018" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2018" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2018" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "Pneumo" "10ug" 11 11 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NTR" "Nitroxoline" "Enterobacteriaceae" "30ug" 15 15 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NTR" "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 24 22 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" "5ug" 28 28 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OFX" "Ofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OFX" "Ofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "ORI" "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "ORI" "Oritavancin" "PK/PD" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2018" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Pneumo" "1ug" 20 20 FALSE +"EUCAST 2018" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2018" "DISK" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" "1 unit" 21 21 FALSE +"EUCAST 2018" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Gramneg" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Grampos" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "PEN" "Benzylpenicillin" "H. influenzae" "1 unit" 12 12 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" "1 unit" 25 25 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE +"EUCAST 2018" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2018" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE +"EUCAST 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2018" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 2 FALSE +"EUCAST 2018" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2018" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 17 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 16 16 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2018" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2018" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2018" "DISK" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" "5ug" 25 25 FALSE +"EUCAST 2018" "MIC" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C. difficile" 0.004 1024 FALSE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2018" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2018" "MIC" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" 1 1 FALSE +"EUCAST 2018" "DISK" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H. influenzae" "5ug" 18 18 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" "5ug" 20 20 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 15 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" "5ug" 22 17 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" 0.064 0.5 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "Pneumo" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "H. influenzae" 1 1 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. catarrhalis" 1 1 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2018" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" "1.25ug/23.75ug" 19 16 FALSE +"EUCAST 2018" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Aeromonas" 2 4 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" "1.25ug/23.75ug" 28 28 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2018" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" 1 2 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 16 16 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2018" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2018" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" 1 2 FALSE +"EUCAST 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H. influenzae" "30ug" 25 22 FALSE +"EUCAST 2018" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" "30ug" 28 28 FALSE +"EUCAST 2018" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" "30ug" 28 25 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2018" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" "30ug" 25 22 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" 1 2 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" "30ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" 2 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 15 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2018" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C. difficile" 0.25 1024 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 15 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 16 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 16 16 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "H. influenzae" 8 8 FALSE +"EUCAST 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" "15ug" 23 20 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 18 15 TRUE +"EUCAST 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE +"EUCAST 2018" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2018" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2018" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 17 14 TRUE +"EUCAST 2018" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 2 4 TRUE +"EUCAST 2018" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2018" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 2 4 FALSE +"EUCAST 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2018" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 17 FALSE +"EUCAST 2018" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2018" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 18 18 FALSE +"EUCAST 2018" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 16 16 FALSE +"EUCAST 2018" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2018" "DISK" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" "5ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" 1 1 FALSE +"EUCAST 2018" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2018" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2018" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2018" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2018" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2018" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2018" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" 2 2 FALSE +"EUCAST 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2018" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2018" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2018" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2017" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2017" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2017" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2017" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2017" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2017" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 15 15 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE +"EUCAST 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 15 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 19 17 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 16 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 18 15 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 8 16 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 16 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 8 16 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2017" "DISK" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" "2ug" 26 26 FALSE +"EUCAST 2017" "MIC" "B_AERCC" "Aerococcus" 3 "AMP" "Ampicillin" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" 1 1 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H. influenzae" "2ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMP" "Ampicillin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2017" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" 0.5 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2017" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 2 2 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AMX" "Amoxicillin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2017" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2017" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 0.002 4 FALSE +"EUCAST 2017" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 26 21 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 50 16 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 1 16 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "H. influenzae" 0.125 4 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "AZM" "Azithromycin" "Kingella" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "N. gonorrhoeae" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "BPR" "Ceftobiprole" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" "5ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "BPR" "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 8 8 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" "30ug" 50 28 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" 0.032 0.5 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" "5ug" 21 18 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Gramneg" 8 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Grampos" 8 8 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" 2 2 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" "30ug" 30 30 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" 2 2 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 4 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" "30ug" 21 21 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" 8 8 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 26 24 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 21 21 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 1 1 FALSE +"EUCAST 2017" "DISK" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" "5ug" 21 21 FALSE +"EUCAST 2017" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2017" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2017" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2017" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CIP" "Ciprofloxacin" "Kingella" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 26 26 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 21 21 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" "2ug" 19 19 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "H. influenzae" 1 32 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CLR" "Clarithromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 4 4 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H. influenzae" "10ug" 26 23 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CPT" "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 25 22 FALSE +"EUCAST 2017" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H. influenzae" "30ug" 31 31 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" "30ug" 30 30 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CRO" "Ceftriaxone" "Kingella" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" "30ug" 24 21 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" 1 2 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Pneumo" 0.5 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" 1 1 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H. influenzae" "30ug" 25 25 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H. influenzae" "5ug" 27 27 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" "5ug" 27 27 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CTX" "Cefotaxime" "Kingella" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" "5ug" 20 17 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" 1 2 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Pneumo" 0.5 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2017" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2017" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2017" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 1 2 FALSE +"EUCAST 2017" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 0.125 1 FALSE +"EUCAST 2017" "DISK" "Intravenous" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenzae" "30ug" 26 25 FALSE +"EUCAST 2017" "DISK" "Oral" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenzae" "30ug" 50 26 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" "30ug" 29 29 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "CXM" "Cefuroxime" "Kingella" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 21 18 FALSE +"EUCAST 2017" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2017" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 4 8 FALSE +"EUCAST 2017" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 0.125 4 FALSE +"EUCAST 2017" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.5 1 FALSE +"EUCAST 2017" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" "10ug" 13 13 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "CZA" "Ceftazidime/avibactam" "Pseudo" "10ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "CZA" "Ceftazidime/avibactam" "Pseudo" 8 8 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CZA" "Ceftazidime/avibactam" "PK/PD" 8 8 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZO" "Cefazolin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" "30ug" 23 23 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "CZT" "Ceftolozane/tazobactam" "Pseudo" 4 4 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "CZT" "Ceftolozane/tazobactam" "PK/PD" 4 4 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "DAL" "Dalbavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "DAL" "Dalbavancin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C. difficile" 4 1024 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" "10ug" 24 21 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." "10ug" 24 21 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." 1 2 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOR" "Doripenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "DOR" "Doripenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "H. influenzae" 1 1 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" "10ug" 30 30 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" 1 1 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" "10ug" 25 22 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" 1 2 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Pneumo" 1 1 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "DOR" "Doripenem" "PK/PD" 1 2 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "DOX" "Doxycycline" "H. influenzae" 1 2 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "DOX" "Doxycycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Pneumo" 1 2 FALSE +"EUCAST 2017" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 24 24 FALSE +"EUCAST 2017" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE +"EUCAST 2017" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE +"EUCAST 2017" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "ERY" "Erythromycin" "H. influenzae" 0.5 16 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ERY" "Erythromycin" "H. influenzae" "15ug" 50 10 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" "15ug" 20 20 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "ERY" "Erythromycin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" "15ug" 22 19 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 22 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 27 21 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" "30ug" 20 20 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" 4 4 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 19 19 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 8 8 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Pneumo" 1 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2017" "MIC" "F_CANDD" "Candida" 3 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2017" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2017" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.002 32 FALSE +"EUCAST 2017" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2017" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2017" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 FALSE +"EUCAST 2017" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Enterobacteriaceae" "200ug" 24 24 TRUE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2017" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2017" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2017" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2017" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 20 20 FALSE +"EUCAST 2017" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" 8 8 FALSE +"EUCAST 2017" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C. difficile" 2 1024 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." "10ug" 23 23 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" "10ug" 15 15 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 2 4 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 23 17 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 21 18 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 4 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" 2 2 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 20 17 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 4 8 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Pneumo" 2 2 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2017" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "KAN" "Kanamycin" "Staphs" 8 8 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "KAN" "Kanamycin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "KAN" "Kanamycin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 19 19 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 21 21 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 16 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 4 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" "10ug" 22 19 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" 2 4 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 4 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 23 19 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 23 20 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 0.5 1 FALSE +"EUCAST 2017" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "Aerococcus" 2 2 FALSE +"EUCAST 2017" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2017" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2017" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" "5ug" 28 28 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "LVX" "Levofloxacin" "Kingella" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" 1 1 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 1 1 FALSE +"EUCAST 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LVX" "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "LVX" "Levofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" 2 2 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2017" "DISK" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" "10ug" 31 31 FALSE +"EUCAST 2017" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "Aerococcus" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2017" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 2 2 FALSE +"EUCAST 2017" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 0.25 1 FALSE +"EUCAST 2017" "DISK" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" "10ug" 30 30 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "MEM" "Meropenem" "Kingella" 0.032 0.032 FALSE +"EUCAST 2017" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2017" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" "10ug" 33 33 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 2 2 FALSE +"EUCAST 2017" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 0.25 1 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C. difficile" 4 1024 FALSE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H. influenzae" "5ug" 28 28 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" "5ug" 23 23 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" "5ug" 28 28 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "MFX" "Moxifloxacin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 19 19 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" "5ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2017" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2017" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 0.002 2 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" 1 2 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H. influenzae" "30ug" 24 21 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" "30ug" 25 22 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 20 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" "30ug" 24 21 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" 0.5 1 FALSE +"EUCAST 2017" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2017" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2017" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "NAL" "Nalidixic acid" "H. influenzae" "30ug" 23 23 FALSE +"EUCAST 2017" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. catarrhalis" "30ug" 23 23 FALSE +"EUCAST 2017" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" "10ug" 15 12 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." "10ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" "10ug" 12 12 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2017" "DISK" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" "100ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_AERCC" "Aerococcus" 3 "NIT" "Nitrofurantoin" "Aerococcus" 16 16 FALSE +"EUCAST 2017" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2017" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2017" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2017" "DISK" "UTI" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2017" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2017" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_AERCC" "Aerococcus" 3 "NOR" "Norfloxacin" "Aerococcus" "10ug" 17 17 FALSE +"EUCAST 2017" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2017" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2017" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2017" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "Pneumo" "10ug" 11 11 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NTR" "Nitroxoline" "Enterobacteriaceae" "30ug" 15 15 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NTR" "Nitroxoline" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 24 22 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H. influenzae" "5ug" 30 30 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" "5ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OFX" "Ofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OFX" "Ofloxacin" "Staphs" "5ug" 24 24 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "ORI" "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "ORI" "Oritavancin" "PK/PD" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2017" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Pneumo" "1ug" 20 20 FALSE +"EUCAST 2017" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2017" "DISK" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" "1 unit" 21 21 FALSE +"EUCAST 2017" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Gramneg" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Grampos" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "PEN" "Benzylpenicillin" "H. influenzae" "1 unit" 12 12 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" "1 unit" 25 25 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "PEN" "Benzylpenicillin" "Kingella" 0.032 0.032 FALSE +"EUCAST 2017" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2017" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE +"EUCAST 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2017" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 2 FALSE +"EUCAST 2017" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2017" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 17 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 16 16 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2017" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2017" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2017" "DISK" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" "5ug" 25 25 FALSE +"EUCAST 2017" "MIC" "B_AERCC" "Aerococcus" 3 "RIF" "Rifampicin" "Aerococcus" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C. difficile" 0.004 1024 FALSE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2017" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2017" "MIC" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" 1 1 FALSE +"EUCAST 2017" "DISK" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H. influenzae" "5ug" 18 18 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" "5ug" 20 20 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "RIF" "Rifampicin" "Kingella" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 15 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" "5ug" 22 17 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" 0.064 0.5 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "RXT" "Roxithromycin" "H. influenzae" 1 16 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "Pneumo" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "H. influenzae" 1 1 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. catarrhalis" 1 1 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 14 11 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" "1.25ug/23.75ug" 28 28 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Kingella" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2017" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" 1 2 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 23 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 16 16 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2017" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2017" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" 1 2 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H. influenzae" "30ug" 25 22 FALSE +"EUCAST 2017" "DISK" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" "30ug" 28 28 FALSE +"EUCAST 2017" "MIC" "B_KGLLA_KING" "Kingella kingae" 2 "TCY" "Tetracycline" "Kingella" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" "30ug" 28 25 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2017" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" "30ug" 25 22 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" 1 2 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" "30ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" 2 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 15 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2017" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C. difficile" 0.25 1024 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 15 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 16 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 23 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 16 16 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "H. influenzae" 0.125 8 FALSE +"EUCAST 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TLT" "Telithromycin" "H. influenzae" "15ug" 50 12 FALSE +"EUCAST 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" "15ug" 23 20 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 18 15 TRUE +"EUCAST 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE +"EUCAST 2017" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2017" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2017" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 17 14 TRUE +"EUCAST 2017" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 2 4 TRUE +"EUCAST 2017" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2017" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 2 4 FALSE +"EUCAST 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2017" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 17 FALSE +"EUCAST 2017" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2017" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 18 18 FALSE +"EUCAST 2017" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 16 16 FALSE +"EUCAST 2017" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2017" "DISK" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" "5ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "Aerococcus" 1 1 FALSE +"EUCAST 2017" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2017" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2017" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2017" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2017" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2017" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2017" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" 2 2 FALSE +"EUCAST 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2017" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2017" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2017" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2016" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2016" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2016" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2016" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2016" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2016" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" 2 2 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H. influenzae" "2ug/1ug" 15 15 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. catarrhalis" 1 1 FALSE +"EUCAST 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 16 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 8 16 FALSE +"EUCAST 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 16 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2016" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 8 16 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "H. influenzae" 1 1 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H. influenzae" "2ug" 16 16 FALSE +"EUCAST 2016" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2016" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" "2ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2016" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" 0.5 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2016" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "AMX" "Amoxicillin" "H. influenzae" 2 2 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2016" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2016" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 0.002 4 FALSE +"EUCAST 2016" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 24 21 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 50 16 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 1 16 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "H. influenzae" 0.125 4 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "N. gonorrhoeae" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "BPR" "Ceftobiprole" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" "5ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "BPR" "Ceftobiprole" "Staphs" 2 2 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "BPR" "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 8 8 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" "30ug" 50 28 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" 0.032 0.5 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H. influenzae" "5ug" 25 25 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" "5ug" 21 18 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Gramneg" 8 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Grampos" 8 8 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "H. influenzae" 2 2 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H. influenzae" "30ug" 28 28 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" "30ug" 30 30 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. catarrhalis" 2 2 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 4 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" "30ug" 21 21 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" 8 8 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 21 21 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 1 1 FALSE +"EUCAST 2016" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2016" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2016" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 25 22 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CIP" "Ciprofloxacin" "Pneumo" "5ug" 50 16 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CIP" "Ciprofloxacin" "Pneumo" 0.125 2 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" "2ug" 19 19 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "H. influenzae" 1 32 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 4 4 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "H. influenzae" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H. influenzae" "10ug" 26 23 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CPT" "Ceftaroline" "H. influenzae" 0.032 0.032 FALSE +"EUCAST 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 23 20 FALSE +"EUCAST 2016" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H. influenzae" "30ug" 30 30 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" "30ug" 24 21 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. catarrhalis" 1 2 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Pneumo" 0.5 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "H. influenzae" 1 1 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H. influenzae" "30ug" 25 25 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "H. influenzae" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" "5ug" 20 17 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. catarrhalis" 1 2 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Pneumo" 0.5 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2016" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2016" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2016" "MIC" "Intravenous" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 1 2 FALSE +"EUCAST 2016" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "H. influenzae" 0.125 1 FALSE +"EUCAST 2016" "DISK" "Intravenous" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenzae" "30ug" 26 25 FALSE +"EUCAST 2016" "DISK" "Oral" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenzae" "30ug" 50 26 FALSE +"EUCAST 2016" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 21 18 FALSE +"EUCAST 2016" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2016" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 4 8 FALSE +"EUCAST 2016" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. catarrhalis" 0.125 4 FALSE +"EUCAST 2016" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.5 1 FALSE +"EUCAST 2016" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZO" "Cefazolin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" "30ug" 23 23 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Enterobacteriaceae" 1 1 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "CZT" "Ceftolozane/tazobactam" "Pseudo" 4 4 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CZT" "Ceftolozane/tazobactam" "PK/PD" 4 4 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "DAL" "Dalbavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "DAL" "Dalbavancin" "PK/PD" 0.25 0.25 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Strep A, B, C, G" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Viridans strept" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C. difficile" 4 1024 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" "10ug" 24 21 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." "10ug" 23 20 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." 1 2 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOR" "Doripenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "DOR" "Doripenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "H. influenzae" 1 1 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" "10ug" 30 30 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. catarrhalis" 1 1 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" "10ug" 25 22 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" 1 2 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Pneumo" 1 1 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "DOR" "Doripenem" "PK/PD" 1 2 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "DOX" "Doxycycline" "H. influenzae" 1 2 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Pneumo" 1 2 FALSE +"EUCAST 2016" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 24 24 FALSE +"EUCAST 2016" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE +"EUCAST 2016" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE +"EUCAST 2016" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "ERY" "Erythromycin" "H. influenzae" 0.5 16 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ERY" "Erythromycin" "H. influenzae" "15ug" 50 10 FALSE +"EUCAST 2016" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2016" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" "15ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 22 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 24 21 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "H. influenzae" 0.25 0.25 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H. influenzae" "30ug" 27 27 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" "30ug" 20 20 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. catarrhalis" 4 4 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 19 19 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 8 8 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Pneumo" 1 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2016" "MIC" "F_CANDD" "Candida" 3 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2016" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2016" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.002 32 FALSE +"EUCAST 2016" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2016" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2016" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2016" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2016" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2016" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 35 35 FALSE +"EUCAST 2016" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C. difficile" 2 1024 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." "10ug" 23 23 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" "10ug" 15 15 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2016" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 2 4 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 23 17 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 21 18 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 4 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "H. influenzae" 2 2 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 20 17 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 4 8 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Pneumo" 2 2 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2016" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "KAN" "Kanamycin" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "KAN" "Kanamycin" "Staphs" 8 8 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 19 19 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 19 19 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 16 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 4 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" "10ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" 2 4 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 4 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 21 18 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 1 2 FALSE +"EUCAST 2016" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" "5ug" 15 15 TRUE +"EUCAST 2016" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2016" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "H. influenzae" 1 1 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H. influenzae" "5ug" 26 26 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" "5ug" 26 26 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. catarrhalis" 1 1 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 20 17 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 1 2 FALSE +"EUCAST 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Staphs" "5ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Staphs" 1 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" "5ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" 2 2 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 1 2 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2016" "MIC" "Non-meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 2 2 FALSE +"EUCAST 2016" "MIC" "Meningitis" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "H. influenzae" 0.25 1 FALSE +"EUCAST 2016" "DISK" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenzae" "10ug" 20 20 FALSE +"EUCAST 2016" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2016" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" "10ug" 33 33 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. catarrhalis" 2 2 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 2 2 FALSE +"EUCAST 2016" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 0.25 1 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C. difficile" 4 1024 FALSE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H. influenzae" "5ug" 25 25 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" "5ug" 23 23 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Staphs" "5ug" 24 21 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Staphs" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" "5ug" 22 22 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2016" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2016" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2016" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 0.002 2 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "MNO" "Minocycline" "H. influenzae" 1 2 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H. influenzae" "30ug" 24 21 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" "30ug" 25 22 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 20 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" "30ug" 24 21 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2016" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "MUP" "Mupirocin" "Staphs" "200ug" 30 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "MUP" "Mupirocin" "Staphs" 1 256 FALSE +"EUCAST 2016" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "NAL" "Nalidixic acid" "H. influenzae" "30ug" 23 23 FALSE +"EUCAST 2016" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. catarrhalis" "30ug" 23 23 FALSE +"EUCAST 2016" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" "10ug" 15 12 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." "10ug" 16 16 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" "10ug" 12 12 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2016" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2016" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2016" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2016" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2016" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2016" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2016" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2016" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2016" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2016" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2016" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "Pneumo" "10ug" 12 12 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "NOR" "Norfloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "H. influenzae" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H. influenzae" "5ug" 23 23 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" "5ug" 25 25 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. catarrhalis" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Pneumo" "5ug" 50 13 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Pneumo" 0.125 4 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "ORI" "Oritavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2016" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Pneumo" "1ug" 20 20 FALSE +"EUCAST 2016" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Gramneg" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Grampos" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "PEN" "Benzylpenicillin" "H. influenzae" "1 unit" 12 12 FALSE +"EUCAST 2016" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2016" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE +"EUCAST 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2016" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 2 FALSE +"EUCAST 2016" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2016" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 17 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 16 16 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2016" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2016" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2016" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C. difficile" 0.004 1024 FALSE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2016" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2016" "MIC" "Prophylaxis" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "H. influenzae" 1 1 FALSE +"EUCAST 2016" "DISK" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H. influenzae" "5ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 15 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" "5ug" 22 17 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" 0.064 0.5 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "RXT" "Roxithromycin" "H. influenzae" 1 16 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "Pneumo" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "H. influenzae" 1 1 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. catarrhalis" 1 1 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" "300ug" 14 14 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 16 13 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 16 13 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2016" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2016" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. catarrhalis" 0.5 1 FALSE +"EUCAST 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2016" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE +"EUCAST 2016" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" 1 2 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 23 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 16 16 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2016" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2016" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "H. influenzae" 1 2 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H. influenzae" "30ug" 25 22 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" "30ug" 28 25 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. catarrhalis" 1 2 FALSE +"EUCAST 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2016" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" "30ug" 25 22 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" 1 2 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2016" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" "30ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" 2 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2016" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C. difficile" 0.25 1024 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 15 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 16 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 23 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 16 16 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "H. influenzae" 0.125 8 FALSE +"EUCAST 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TLT" "Telithromycin" "H. influenzae" "15ug" 50 12 FALSE +"EUCAST 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. catarrhalis" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" "15ug" 23 20 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 18 15 TRUE +"EUCAST 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE +"EUCAST 2016" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2016" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2016" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 17 14 TRUE +"EUCAST 2016" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 2 4 TRUE +"EUCAST 2016" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 16 16 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2016" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2016" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 2 4 FALSE +"EUCAST 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "TZD" "Tedizolid" "Staphs" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Viridans strept" 0.25 0.25 FALSE +"EUCAST 2016" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 17 FALSE +"EUCAST 2016" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2016" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 18 18 FALSE +"EUCAST 2016" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 16 16 FALSE +"EUCAST 2016" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2016" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2016" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2016" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2016" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2016" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2016" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2016" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" 2 2 FALSE +"EUCAST 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2016" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2016" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2016" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2015" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2015" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2015" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2015" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2015" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2015" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H. influenaza" "2ug/1ug" 15 15 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H. influenaza" 2 2 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. cattharalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. cattharalis" 1 1 FALSE +"EUCAST 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 18 16 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 16 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 8 16 FALSE +"EUCAST 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 16 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2015" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 8 16 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H. influenaza" "2ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H. influenaza" 1 1 FALSE +"EUCAST 2015" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" "2ug" 17 17 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2015" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" 0.5 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2015" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMX" "Amoxicillin" "H. influenaza" 2 2 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2015" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2015" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 0.002 4 FALSE +"EUCAST 2015" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 24 21 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 50 16 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 1 16 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AZM" "Azithromycin" "H. influenaza" 0.125 4 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. cattharalis" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "N. gonorrhoeae" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "BPR" "Ceftobiprole" "PK/PD" 4 4 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 8 8 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" "30ug" 50 28 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" 0.032 0.5 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H. influenaza" "5ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H. influenaza" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. cattharalis" "5ug" 21 18 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. cattharalis" 0.5 1 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Gramneg" 8 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Grampos" 8 8 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H. influenaza" "30ug" 28 28 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H. influenaza" 2 2 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. cattharalis" "30ug" 30 30 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. cattharalis" 2 2 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 4 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" "30ug" 21 21 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" 8 8 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 21 21 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 1 1 FALSE +"EUCAST 2015" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2015" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H. influenaza" "5ug" 26 26 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H. influenaza" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. cattharalis" "5ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. cattharalis" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.032 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 25 22 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CIP" "Ciprofloxacin" "Pneumo" "5ug" 50 16 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CIP" "Ciprofloxacin" "Pneumo" 0.125 2 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" "2ug" 19 19 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CLR" "Clarithromycin" "H. influenaza" 1 32 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. cattharalis" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 4 4 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H. influenaza" "10ug" 26 23 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H. influenaza" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "H. influenaza" 0.032 0.032 FALSE +"EUCAST 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 23 20 FALSE +"EUCAST 2015" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H. influenaza" "30ug" 30 30 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H. influenaza" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. cattharalis" "30ug" 24 21 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. cattharalis" 1 2 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Pneumo" 0.5 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H. influenaza" "30ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H. influenaza" 1 1 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H. influenaza" "5ug" 26 26 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H. influenaza" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. cattharalis" "5ug" 20 17 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. cattharalis" 1 2 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Pneumo" 0.5 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2015" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2015" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2015" "DISK" "Intravenous" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenaza" "30ug" 26 25 FALSE +"EUCAST 2015" "DISK" "Oral" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenaza" "30ug" 50 26 FALSE +"EUCAST 2015" "MIC" "Intravenous" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenaza" 1 2 FALSE +"EUCAST 2015" "MIC" "Oral" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenaza" 0.125 1 FALSE +"EUCAST 2015" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. cattharalis" "30ug" 21 18 FALSE +"EUCAST 2015" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. cattharalis" "30ug" 50 21 FALSE +"EUCAST 2015" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. cattharalis" 4 8 FALSE +"EUCAST 2015" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. cattharalis" 0.125 4 FALSE +"EUCAST 2015" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.5 1 FALSE +"EUCAST 2015" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZO" "Cefazolin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2015" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C. difficile" 4 1024 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" "10ug" 24 21 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." "10ug" 23 20 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." 1 2 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOR" "Doripenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "DOR" "Doripenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H. influenaza" "10ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H. influenaza" 1 1 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. cattharalis" "10ug" 30 30 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. cattharalis" 1 1 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" "10ug" 25 22 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" 1 2 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Pneumo" 1 1 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "DOR" "Doripenem" "PK/PD" 1 2 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOX" "Doxycycline" "H. influenaza" 1 2 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. cattharalis" 1 2 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Pneumo" 1 2 FALSE +"EUCAST 2015" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 24 24 FALSE +"EUCAST 2015" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE +"EUCAST 2015" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ERY" "Erythromycin" "H. influenaza" "15ug" 50 10 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ERY" "Erythromycin" "H. influenaza" 0.5 16 FALSE +"EUCAST 2015" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. cattharalis" "15ug" 23 20 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. cattharalis" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" "15ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 22 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H. influenaza" "10ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H. influenaza" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. cattharalis" "10ug" 29 29 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. cattharalis" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 24 21 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H. influenaza" "30ug" 27 27 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H. influenaza" 0.25 0.25 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. cattharalis" "30ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. cattharalis" 4 4 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 19 19 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 8 8 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Pneumo" 1 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2015" "MIC" "F_CANDD" "Candida" 3 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2015" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2015" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.002 32 FALSE +"EUCAST 2015" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2015" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2015" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2015" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2015" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2015" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 35 35 FALSE +"EUCAST 2015" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C. difficile" 2 1024 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." "10ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" "10ug" 15 15 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2015" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 2 4 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 23 17 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 21 18 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 4 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H. influenaza" "10ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H. influenaza" 2 2 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. cattharalis" "10ug" 29 29 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. cattharalis" 2 2 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 20 17 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 4 8 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Pneumo" 2 2 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2015" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ITR" "Itraconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ITR" "Itraconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 19 19 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 19 19 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 16 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 4 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" "10ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" 2 4 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 4 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 21 18 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 1 2 FALSE +"EUCAST 2015" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2015" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H. influenaza" "5ug" 26 26 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H. influenaza" 1 1 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. cattharalis" "5ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. cattharalis" 1 1 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 20 17 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 1 2 FALSE +"EUCAST 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Staphs" "5ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Staphs" 1 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" "5ug" 17 17 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" 2 2 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 1 2 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2015" "DISK" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenaza" "10ug" 20 20 FALSE +"EUCAST 2015" "MIC" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenaza" 2 2 FALSE +"EUCAST 2015" "MIC" "Meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenaza" 0.25 1 FALSE +"EUCAST 2015" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2015" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. cattharalis" "10ug" 33 33 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. cattharalis" 2 2 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 2 2 FALSE +"EUCAST 2015" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 0.25 1 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2015" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C. difficile" 4 1024 FALSE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H. influenaza" "5ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H. influenaza" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. cattharalis" "5ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. cattharalis" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Staphs" "5ug" 24 21 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Staphs" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" "5ug" 22 22 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2015" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2015" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2015" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 0.002 2 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H. influenaza" "30ug" 24 21 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H. influenaza" 1 2 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. cattharalis" "30ug" 25 22 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. cattharalis" 1 2 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 20 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" "30ug" 24 21 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" 0.5 1 FALSE +"EUCAST 2015" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2015" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "MUP" "Mupirocin" "Staphs" "200ug" 30 18 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "MUP" "Mupirocin" "Staphs" 1 256 FALSE +"EUCAST 2015" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "NAL" "Nalidixic acid" "H. influenaza" "30ug" 23 23 FALSE +"EUCAST 2015" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. cattharalis" "30ug" 23 23 FALSE +"EUCAST 2015" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" "10ug" 15 12 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." "10ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" "10ug" 12 12 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2015" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2015" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2015" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2015" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2015" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2015" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2015" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2015" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2015" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2015" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2015" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "Pneumo" "10ug" 12 12 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "NOR" "Norfloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H. influenaza" "5ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H. influenaza" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. cattharalis" "5ug" 25 25 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. cattharalis" 0.5 0.5 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Pneumo" "5ug" 50 13 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Pneumo" 0.125 4 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2015" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Pneumo" "1ug" 20 20 FALSE +"EUCAST 2015" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Gramneg" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Grampos" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "PEN" "Benzylpenicillin" "H. influenaza" "1 unit" 12 12 FALSE +"EUCAST 2015" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2015" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE +"EUCAST 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2015" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 2 FALSE +"EUCAST 2015" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2015" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 17 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 16 16 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2015" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2015" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2015" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C. difficile" 0.004 1024 FALSE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2015" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2015" "DISK" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H. influenaza" "5ug" 18 18 FALSE +"EUCAST 2015" "MIC" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H. influenaza" 1 1 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 15 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" "5ug" 22 17 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" 0.064 0.5 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RXT" "Roxithromycin" "H. influenaza" 1 16 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. cattharalis" 0.5 1 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "Pneumo" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SAM" "Ampicillin/sulbactam" "H. influenaza" 1 1 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. cattharalis" 1 1 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 16 13 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 16 13 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenaza" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenaza" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2015" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. cattharalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. cattharalis" 0.5 1 FALSE +"EUCAST 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2015" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" 1 2 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 16 16 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2015" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2015" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H. influenaza" "30ug" 25 22 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H. influenaza" 1 2 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. cattharalis" "30ug" 28 25 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. cattharalis" 1 2 FALSE +"EUCAST 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2015" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" "30ug" 25 22 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" 1 2 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2015" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" "30ug" 17 17 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" 2 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2015" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C. difficile" 0.25 1024 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 15 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 16 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 23 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 16 16 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TLT" "Telithromycin" "H. influenaza" "15ug" 50 12 FALSE +"EUCAST 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TLT" "Telithromycin" "H. influenaza" 0.125 8 FALSE +"EUCAST 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. cattharalis" "15ug" 23 20 FALSE +"EUCAST 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. cattharalis" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" "15ug" 23 20 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 18 15 TRUE +"EUCAST 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE +"EUCAST 2015" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2015" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2015" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 17 14 TRUE +"EUCAST 2015" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 2 4 TRUE +"EUCAST 2015" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2015" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2015" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 2 4 FALSE +"EUCAST 2015" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 17 FALSE +"EUCAST 2015" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2015" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 18 18 FALSE +"EUCAST 2015" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 16 16 FALSE +"EUCAST 2015" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2015" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2015" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2015" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2015" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2015" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2015" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2015" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" 2 2 FALSE +"EUCAST 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2015" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2015" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2015" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2014" "MIC" "F_ASPRG_NIGR" "Aspergillus niger" 2 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2014" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2014" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2014" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2014" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2014" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 19 19 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 16 16 TRUE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H. influenaza" "2ug/1ug" 15 15 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H. influenaza" 2 2 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. cattharalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M. cattharalis" 1 1 FALSE +"EUCAST 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" "2ug/1ug" 15 15 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" "PK/PD" 2 8 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 16 13 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." "30ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetobacter spp." 8 16 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" "30ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseudo" 8 16 FALSE +"EUCAST 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 16 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2014" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" "PK/PD" 8 16 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H. influenaza" "2ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H. influenaza" 1 1 FALSE +"EUCAST 2014" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" "2ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" "2ug" 17 17 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2014" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" 0.5 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" "PK/PD" 2 8 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2014" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H. pylori" 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMX" "Amoxicillin" "H. influenaza" 2 2 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N. meningitidis" 0.125 1 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" "PK/PD" 2 8 FALSE +"EUCAST 2014" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2014" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Candida" 0.002 4 FALSE +"EUCAST 2014" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 24 21 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" "30ug" 50 16 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseudo" 1 16 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" "PK/PD" 4 8 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AZM" "Azithromycin" "H. influenaza" 0.125 4 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M. cattharalis" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "N. gonorrhoeae" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" "10ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseudo" 8 8 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" "PK/PD" 4 8 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" "30ug" 50 28 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" 0.032 0.5 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H. influenaza" "5ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H. influenaza" 0.125 0.125 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. cattharalis" "5ug" 21 18 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M. cattharalis" 0.5 1 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Gramneg" 8 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Grampos" 8 8 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H. influenaza" "30ug" 28 28 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H. influenaza" 2 2 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. cattharalis" "30ug" 30 30 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M. cattharalis" 2 2 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N. meningitidis" 2 4 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" "30ug" 19 19 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strep A, B, C, G" 8 8 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" "30ug" 21 21 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" 8 8 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." "5ug" 21 21 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetobacter spp." 1 1 FALSE +"EUCAST 2014" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" "5ug" 26 26 FALSE +"EUCAST 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter jejuni and coli" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "CIP" "Ciprofloxacin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2014" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H. influenaza" "5ug" 26 26 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H. influenaza" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. cattharalis" "5ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M. cattharalis" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N. gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N. meningitidis" 0.032 0.06 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" "5ug" 25 22 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseudo" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.064 0.064 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CIP" "Ciprofloxacin" "Pneumo" "5ug" 50 16 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CIP" "Ciprofloxacin" "Pneumo" 0.125 2 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." "2ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "CLI" "Clindamycin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" "2ug" 17 17 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strep A, B, C, G" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" "2ug" 19 19 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H. pylori" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CLR" "Clarithromycin" "H. influenaza" 1 32 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M. cattharalis" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetobacter spp." 2 2 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseudo" 4 4 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H. influenaza" "10ug" 26 23 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H. influenaza" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "H. influenaza" 0.032 0.032 FALSE +"EUCAST 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" "PK/PD" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 23 20 FALSE +"EUCAST 2014" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H. influenaza" "30ug" 30 30 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H. influenaza" 0.125 0.125 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. cattharalis" "30ug" 24 21 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M. cattharalis" 1 2 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Pneumo" 0.5 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" "PK/PD" 1 2 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H. influenaza" "30ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H. influenaza" 1 1 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H. influenaza" "5ug" 26 26 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H. influenaza" 0.125 0.125 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. cattharalis" "5ug" 20 17 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M. cattharalis" 1 2 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N. gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N. meningitidis" 0.125 0.125 FALSE +"EUCAST 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" "5ug" 26 26 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella multocida" 0.032 0.032 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Pneumo" 0.5 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" "PK/PD" 1 2 FALSE +"EUCAST 2014" "DISK" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2014" "MIC" "Intravenous" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2014" "DISK" "Intravenous" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenaza" "30ug" 26 25 FALSE +"EUCAST 2014" "DISK" "Oral" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenaza" "30ug" 50 26 FALSE +"EUCAST 2014" "MIC" "Intravenous" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenaza" 1 2 FALSE +"EUCAST 2014" "MIC" "Oral" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H. influenaza" 0.125 1 FALSE +"EUCAST 2014" "DISK" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. cattharalis" "30ug" 21 18 FALSE +"EUCAST 2014" "DISK" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. cattharalis" "30ug" 50 21 FALSE +"EUCAST 2014" "MIC" "Intravenous" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. cattharalis" 4 8 FALSE +"EUCAST 2014" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M. cattharalis" 0.125 4 FALSE +"EUCAST 2014" "MIC" "Intravenous" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.5 1 FALSE +"EUCAST 2014" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" "PK/PD" 4 8 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZO" "Cefazolin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" "PK/PD" 1 2 FALSE +"EUCAST 2014" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C. difficile" 4 1024 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strep A, B, C, G" 1 1 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" "10ug" 24 21 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." "10ug" 23 20 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetobacter spp." 1 2 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOR" "Doripenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "DOR" "Doripenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H. influenaza" "10ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H. influenaza" 1 1 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. cattharalis" "10ug" 30 30 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M. cattharalis" 1 1 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" "10ug" 25 22 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseudo" 1 2 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Pneumo" 1 1 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "DOR" "Doripenem" "PK/PD" 1 2 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOX" "Doxycycline" "H. influenaza" 1 2 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M. cattharalis" 1 2 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella multocida" 1 1 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Pneumo" 1 2 FALSE +"EUCAST 2014" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 24 24 FALSE +"EUCAST 2014" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 8 8 FALSE +"EUCAST 2014" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" "15ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter jejuni and coli" 4 4 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ERY" "Erythromycin" "H. influenaza" "15ug" 50 10 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ERY" "Erythromycin" "H. influenaza" 0.5 16 FALSE +"EUCAST 2014" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" "15ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. cattharalis" "15ug" 23 20 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M. cattharalis" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" "15ug" 21 18 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" "15ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 22 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H. influenaza" "10ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H. influenaza" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. cattharalis" "10ug" 29 29 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M. cattharalis" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" "PK/PD" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 24 21 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H. influenaza" "30ug" 27 27 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H. influenaza" 0.25 0.25 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. cattharalis" "30ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M. cattharalis" 4 4 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" "30ug" 19 19 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseudo" 8 8 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Pneumo" 1 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" "PK/PD" 4 8 FALSE +"EUCAST 2014" "MIC" "F_CANDD" "Candida" 3 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2014" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2014" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Candida" 0.002 32 FALSE +"EUCAST 2014" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2014" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 TRUE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2014" "DISK" "Screen" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2014" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2014" "DISK" "Screen" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2014" "DISK" "Screen" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 35 35 FALSE +"EUCAST 2014" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C. difficile" 2 1024 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEH" "Gentamicin-high" "Viridans strept" 128 128 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." "10ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "GEN" "Gentamicin" "Corynebacterium spp." 1 1 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" "10ug" 15 15 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseudo" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2014" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GEN" "Gentamicin" "Viridans strept" 128 128 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" "PK/PD" 2 4 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." "10ug" 23 17 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 21 18 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 4 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H. influenaza" "10ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H. influenaza" 2 2 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. cattharalis" "10ug" 29 29 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M. cattharalis" 2 2 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" "10ug" 20 17 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseudo" 4 8 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Pneumo" 2 2 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" "PK/PD" 2 8 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." "10ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "LNZ" "Linezolid" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 19 19 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 19 19 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" "10ug" 19 16 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strep A, B, C, G" 2 4 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" "10ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" 2 4 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" "PK/PD" 2 4 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." "5ug" 21 18 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetobacter spp." 1 2 FALSE +"EUCAST 2014" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Enterococcus" 4 4 TRUE +"EUCAST 2014" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H. pylori" 1 1 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H. influenaza" "5ug" 26 26 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H. influenaza" 1 1 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. cattharalis" "5ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M. cattharalis" 1 1 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" "5ug" 20 17 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseudo" 1 2 FALSE +"EUCAST 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" "5ug" 27 27 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella multocida" 0.064 0.064 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Staphs" "5ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Staphs" 1 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" "5ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" "5ug" 17 17 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" 2 2 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" "PK/PD" 1 2 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." "10ug" 21 15 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetobacter spp." 2 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2014" "DISK" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenaza" "10ug" 20 20 FALSE +"EUCAST 2014" "MIC" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenaza" 2 2 FALSE +"EUCAST 2014" "MIC" "Meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H. influenaza" 0.25 1 FALSE +"EUCAST 2014" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" "10ug" 26 26 FALSE +"EUCAST 2014" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria monocytogenes" 0.25 0.25 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. cattharalis" "10ug" 33 33 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M. cattharalis" 2 2 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" "10ug" 24 18 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseudo" 2 8 FALSE +"EUCAST 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 2 2 FALSE +"EUCAST 2014" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 0.25 1 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" "PK/PD" 2 8 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2014" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C. difficile" 4 1024 FALSE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." "5ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "MFX" "Moxifloxacin" "Corynebacterium spp." 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H. influenaza" "5ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H. influenaza" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. cattharalis" "5ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M. cattharalis" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Staphs" "5ug" 24 21 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Staphs" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" "5ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" "5ug" 22 22 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2014" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Candida" 0.016 0.016 FALSE +"EUCAST 2014" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2014" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Candida" 0.002 2 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H. influenaza" "30ug" 24 21 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H. influenaza" 1 2 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. cattharalis" "30ug" 25 22 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M. cattharalis" 1 2 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 20 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" "30ug" 24 21 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" 0.5 1 FALSE +"EUCAST 2014" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C. difficile" 2 2 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2014" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H. pylori" 8 8 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "MUP" "Mupirocin" "Staphs" "200ug" 30 18 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "MUP" "Mupirocin" "Staphs" 1 256 FALSE +"EUCAST 2014" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "NAL" "Nalidixic acid" "H. influenaza" "30ug" 23 23 FALSE +"EUCAST 2014" "DISK" "Screen" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M. cattharalis" "30ug" 23 23 FALSE +"EUCAST 2014" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella multocida" "30ug" 23 23 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" "10ug" 15 12 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." "10ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" "10ug" 12 12 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseudo" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2014" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" "PK/PD" 2 4 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2014" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2014" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2014" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2014" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2014" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" "100ug" 15 15 TRUE +"EUCAST 2014" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strep A, B, C, G" 64 64 TRUE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2014" "DISK" "Screen" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Enterococcus" "10ug" 12 12 FALSE +"EUCAST 2014" "DISK" "Screen" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2014" "DISK" "Screen" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strep A, B, C, G" "10ug" 12 12 FALSE +"EUCAST 2014" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "Pneumo" "10ug" 12 12 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "NOR" "Norfloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H. influenaza" "5ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H. influenaza" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. cattharalis" "5ug" 25 25 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M. cattharalis" 0.5 0.5 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N. gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Pneumo" "5ug" 50 13 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Pneumo" 0.125 4 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" "PK/PD" 0.5 1 FALSE +"EUCAST 2014" "DISK" "Screen" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Pneumo" "1ug" 20 20 FALSE +"EUCAST 2014" "DISK" "Screen" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Enterobacteriaceae" "5ug" 24 24 FALSE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." "1 unit" 29 29 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "PEN" "Benzylpenicillin" "Corynebacterium spp." 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Gramneg" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Grampos" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "Screen" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "PEN" "Benzylpenicillin" "H. influenaza" "1 unit" 12 12 FALSE +"EUCAST 2014" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" "1 unit" 13 13 FALSE +"EUCAST 2014" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria monocytogenes" 1 1 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N. gonorrhoeae" 0.064 1 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N. meningitidis" 0.064 0.25 FALSE +"EUCAST 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" "1 unit" 17 17 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella multocida" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2014" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2014" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" "1 unit" 18 18 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strep A, B, C, G" 0.25 0.25 FALSE +"EUCAST 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 2 FALSE +"EUCAST 2014" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2014" "DISK" "Screen" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 18 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" "PK/PD" 0.25 2 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 17 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" "30ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseudo" 16 16 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" "PK/PD" 4 16 FALSE +"EUCAST 2014" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "F_ASPRG_TERRS" "Aspergillus terreus" 2 "POS" "Posaconazole" "Aspergillus" 0.125 0.25 FALSE +"EUCAST 2014" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2014" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C. difficile" 0.004 1024 FALSE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." "5ug" 30 25 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "RIF" "Rifampicin" "Corynebacterium spp." 0.064 0.5 FALSE +"EUCAST 2014" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H. pylori" 1 1 FALSE +"EUCAST 2014" "DISK" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H. influenaza" "5ug" 18 18 FALSE +"EUCAST 2014" "MIC" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H. influenaza" 1 1 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N. meningitidis" 0.25 0.25 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" "5ug" 21 15 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strep A, B, C, G" 0.064 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" "5ug" 22 17 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" 0.064 0.5 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RXT" "Roxithromycin" "H. influenaza" 1 16 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M. cattharalis" 0.5 1 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strep A, B, C, G" 0.5 1 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "Pneumo" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SAM" "Ampicillin/sulbactam" "H. influenaza" 1 1 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M. cattharalis" 1 1 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" "PK/PD" 2 8 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N. gonorrhoeae" 64 64 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 16 13 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." "1.25ug/23.75ug" 16 13 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetobacter spp." 2 4 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenaza" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H. influenaza" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2014" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria monocytogenes" 0.064 0.064 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. cattharalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M. cattharalis" 0.5 1 FALSE +"EUCAST 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella multocida" 0.25 0.25 FALSE +"EUCAST 2014" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" "1.25ug/23.75ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Stenotrophomonas maltophilia" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" 1 2 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" "75/10-15ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseudo" 16 16 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" "PK/PD" 8 16 FALSE +"EUCAST 2014" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" "30ug" 30 30 FALSE +"EUCAST 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter jejuni and coli" 2 2 FALSE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." "30ug" 24 24 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "TCY" "Tetracycline" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2014" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H. pylori" 1 1 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H. influenaza" "30ug" 25 22 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H. influenaza" 1 2 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. cattharalis" "30ug" 28 25 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M. cattharalis" 1 2 FALSE +"EUCAST 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N. gonorrhoeae" 0.5 1 FALSE +"EUCAST 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N. meningitidis" 1 2 FALSE +"EUCAST 2014" "DISK" "Screen" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella multocida" "30ug" 24 24 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" "30ug" 23 20 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strep A, B, C, G" 1 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" "30ug" 25 22 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" 1 2 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2014" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" "30ug" 15 15 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" "30ug" 17 17 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" 2 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2014" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C. difficile" 0.25 1024 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 15 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" "15ug" 19 16 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" "PK/PD" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 23 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" "75ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseudo" 16 16 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" "PK/PD" 8 16 FALSE +"EUCAST 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TLT" "Telithromycin" "H. influenaza" "15ug" 50 12 FALSE +"EUCAST 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TLT" "Telithromycin" "H. influenaza" 0.125 8 FALSE +"EUCAST 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. cattharalis" "15ug" 23 20 FALSE +"EUCAST 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M. cattharalis" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" "15ug" 20 17 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strep A, B, C, G" 0.25 0.5 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" "15ug" 23 20 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 18 15 TRUE +"EUCAST 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE +"EUCAST 2014" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2014" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2014" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 17 14 TRUE +"EUCAST 2014" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 2 4 TRUE +"EUCAST 2014" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strep A, B, C, G" 2 2 TRUE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." "10ug" 17 17 FALSE +"EUCAST 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetobacter spp." 4 4 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" "10ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseudo" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2014" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2014" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" "PK/PD" 2 4 FALSE +"EUCAST 2014" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 17 FALSE +"EUCAST 2014" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2014" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" "30ug/6ug" 18 18 FALSE +"EUCAST 2014" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseudo" 16 16 FALSE +"EUCAST 2014" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" "PK/PD" 4 16 FALSE +"EUCAST 2014" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C. difficile" 2 2 FALSE +"EUCAST 2014" "DISK" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." "5ug" 17 17 FALSE +"EUCAST 2014" "MIC" "B_CRYNB" "Corynebacterium" 3 "VAN" "Vancomycin" "Corynebacterium spp." 2 2 FALSE +"EUCAST 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2014" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2014" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2014" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" "5ug" 13 13 FALSE +"EUCAST 2014" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strep A, B, C, G" 2 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" 2 2 FALSE +"EUCAST 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2014" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2014" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2014" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2013" "MIC" "F_ASPRG" "Aspergillus" 3 "AMB" "Amphotericin B" "Aspergillus" 1 2 FALSE +"EUCAST 2013" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2013" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2013" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2013" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2013" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "AMB" "Amphotericin B" "Candida" 1 1 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" "20ug/10ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "AMC" "Amoxicillin/clavulanic acid" "Enterococcus" 4 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMC" "Amoxicillin/clavulanic acid" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H.influenzae" "2ug/1ug" 15 15 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "H.influenzae" 2 2 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M.catarrhalis" "2ug/1ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M.catarrhalis" 1 1 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella" "2ug/1ug" 15 15 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMC" "Amoxicillin/clavulanic acid" "Pasteurella" 1 1 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "AMC" "Amoxicillin/clavulanic acid" 2 8 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" "30ug" 16 13 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetob" "30ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Acinetob" 8 16 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseud" "30ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "AMK" "Amikacin" "Pseud" 8 16 FALSE +"EUCAST 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" "30ug" 18 16 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2013" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "AMK" "Amikacin" "Staphs" 8 16 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "AMK" "Amikacin" 8 16 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" "10ug" 14 14 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" "2ug" 10 8 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMP" "Ampicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMP" "Ampicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H.influenzae" "2ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "H.influenzae" 1 1 FALSE +"EUCAST 2013" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria" "2ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "Listeria" 1 1 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "N.meningitidis" 0.125 1 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella" "2ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMP" "Ampicillin" "Pasteurella" 1 1 FALSE +"EUCAST 2013" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "AMP" "Ampicillin" "Staphs" "2ug" 15 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMP" "Ampicillin" "Pneumo" 0.5 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" "2ug" 21 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "AMP" "Ampicillin" 2 8 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMX" "Amoxicillin" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "AMX" "Amoxicillin" "Enterococcus" 4 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMX" "Amoxicillin" "Anaerobes, Gramneg" 0.5 2 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "AMX" "Amoxicillin" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2013" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "AMX" "Amoxicillin" "H.pylori" 0.125 0.125 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMX" "Amoxicillin" "H.influenzae" 2 2 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMX" "Amoxicillin" "N.meningitidis" 0.125 1 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "AMX" "Amoxicillin" "Pasteurella" 1 1 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMX" "Amoxicillin" "Viridans strept" 0.5 2 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "AMX" "Amoxicillin" 2 8 FALSE +"EUCAST 2013" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Candida" 0.032 0.032 FALSE +"EUCAST 2013" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" "30ug" 24 21 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseud" "30ug" 50 16 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "ATM" "Aztreonam" "Pseud" 1 16 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "ATM" "Aztreonam" 4 8 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AZM" "Azithromycin" "H.influenzae" 0.125 4 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M.catarrhalis" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "N.gonorrhoeae" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Staphs" 1 2 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Strept A,B,C,G" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseud" "10ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "CAZ" "Ceftazidime" "Pseud" 8 8 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "CAZ" "Ceftazidime" 4 8 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CEC" "Cefaclor" "H.influenzae" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M.catarrhalis" 0.125 0.125 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" "30ug" 50 28 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Pneumo" 0.032 0.5 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" "5ug" 17 17 TRUE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H.influenzae" "5ug" 25 25 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "H.influenzae" 0.125 0.125 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M.catarrhalis" "5ug" 21 18 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CFM" "Cefixime" "M.catarrhalis" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "N.gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" "30ug" 12 12 TRUE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFR" "Cefadroxil" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" "30ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Gramneg" 8 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CHL" "Chloramphenicol" "Anaerobes, Grampos" 8 8 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H.influenzae" "30ug" 28 28 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "H.influenzae" 2 2 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M.catarrhalis" "30ug" 30 30 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M.catarrhalis" 2 2 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "N.meningitidis" 2 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" "30ug" 18 18 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Staphs" 8 8 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strept A,B,C,G" "30ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Strept A,B,C,G" 8 8 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" "30ug" 21 21 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Pneumo" 8 8 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetob" "5ug" 21 21 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Acinetob" 1 1 FALSE +"EUCAST 2013" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter" "5ug" 26 26 FALSE +"EUCAST 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "Campylobacter" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H.influenzae" "5ug" 26 26 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "H.influenzae" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M.catarrhalis" "5ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M.catarrhalis" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "N.gonorrhoeae" 0.032 0.06 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "N.meningitidis" 0.032 0.06 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseud" "5ug" 25 22 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "CIP" "Ciprofloxacin" "Pseud" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella" "5ug" 27 27 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CIP" "Ciprofloxacin" "Pasteurella" 0.064 0.064 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CIP" "Ciprofloxacin" "Pneumo" "5ug" 50 16 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CIP" "Ciprofloxacin" "Pneumo" 0.125 2 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "CIP" "Ciprofloxacin" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CLI" "Clindamycin" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "CLI" "Clindamycin" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" "2ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Staphs" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strept A,B,C,G" "2ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Strept A,B,C,G" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" "2ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" "2ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "H.pylori" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CLR" "Clarithromycin" "H.influenzae" 1 32 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M.catarrhalis" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Staphs" 1 2 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Strept A,B,C,G" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Enterobacteriaceae" 2 2 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Acinetob" 2 2 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "COL" "Colistin" "Pseud" 4 4 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" "10ug" 21 21 TRUE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H.influenzae" "10ug" 26 23 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "H.influenzae" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" "5ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Enterobacteriaceae" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "H.influenzae" 0.032 0.032 FALSE +"EUCAST 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Staphs" 1 1 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Pneumo" 0.25 0.25 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "CPT" "Ceftaroline" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" "30ug" 23 20 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H.influenzae" "30ug" 30 30 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "H.influenzae" 0.125 0.125 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M.catarrhalis" "30ug" 24 21 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M.catarrhalis" 1 2 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "N.gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "N.meningitidis" 0.125 0.125 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Pneumo" 0.5 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" "30ug" 27 27 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "CRO" "Ceftriaxone" 1 2 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" "30ug" 23 23 TRUE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Enterobacteriaceae" 1 1 TRUE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H.influenzae" "30ug" 25 25 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "H.influenzae" 1 1 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H.influenzae" "5ug" 26 26 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "H.influenzae" 0.125 0.125 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M.catarrhalis" "5ug" 20 17 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M.catarrhalis" 1 2 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "N.gonorrhoeae" 0.125 0.125 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "N.meningitidis" 0.125 0.125 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella" "5ug" 26 26 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "CTX" "Cefotaxime" "Pasteurella" 0.032 0.032 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Pneumo" 0.5 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" "5ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "CTX" "Cefotaxime" 1 2 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXA" "Cefuroxime axetil" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXA" "Cefuroxime axetil" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXA" "Cefuroxime axetil" "H.influenzae" "30ug" 50 26 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXA" "Cefuroxime axetil" "H.influenzae" 0.125 1 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXA" "Cefuroxime axetil" "M.catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXA" "Cefuroxime axetil" "M.catarrhalis" 0.125 4 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" "30ug" 18 18 TRUE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H.influenzae" "30ug" 26 25 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H.influenzae" "30ug" 50 26 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H.influenzae" 1 2 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "H.influenzae" 0.125 1 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M.catarrhalis" "30ug" 21 18 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M.catarrhalis" "30ug" 50 21 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M.catarrhalis" 4 8 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M.catarrhalis" 0.125 4 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.5 1 FALSE +"EUCAST 2013" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" "30ug" 26 26 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CXM" "Cefuroxime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "CXM" "Cefuroxime" 4 8 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZO" "Cefazolin" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "CZO" "Cefazolin" 1 2 FALSE +"EUCAST 2013" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "DAP" "Daptomycin" "C.difficile" 4 1024 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Staphs" 1 1 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Strept A,B,C,G" 1 1 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" "10ug" 24 18 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetob" "10ug" 21 15 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Acinetob" 1 4 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOR" "Doripenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "DOR" "Doripenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H.influenzae" "10ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "H.influenzae" 1 1 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M.catarrhalis" "10ug" 30 30 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOR" "Doripenem" "M.catarrhalis" 1 1 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseud" "10ug" 25 19 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "DOR" "Doripenem" "Pseud" 1 4 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Pneumo" 1 1 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Viridans strept" 1 1 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "DOR" "Doripenem" 1 4 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOX" "Doxycycline" "H.influenzae" 1 2 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "DOX" "Doxycycline" "M.catarrhalis" 1 2 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "DOX" "Doxycycline" "Pasteurella" 1 1 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Staphs" 1 2 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "DOX" "Doxycycline" "Strept A,B,C,G" 1 2 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Pneumo" 1 2 FALSE +"EUCAST 2013" "DISK" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter" "15ug" 24 24 FALSE +"EUCAST 2013" "MIC" "B_CMPYL_COLI" "Campylobacter coli" 2 "ERY" "Erythromycin" "Campylobacter" 8 8 FALSE +"EUCAST 2013" "DISK" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter" "15ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_CMPYL_JEJN_JEJN" "Campylobacter jejuni jejuni" 1 "ERY" "Erythromycin" "Campylobacter" 4 4 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ERY" "Erythromycin" "H.influenzae" "15ug" 50 10 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ERY" "Erythromycin" "H.influenzae" 0.5 16 FALSE +"EUCAST 2013" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria" "15ug" 25 25 FALSE +"EUCAST 2013" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "ERY" "Erythromycin" "Listeria" 1 1 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M.catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M.catarrhalis" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Staphs" 1 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strept A,B,C,G" "15ug" 21 18 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Strept A,B,C,G" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" "15ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" "10ug" 25 22 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ETP" "Ertapenem" "Anaerobes, Gramneg" 1 1 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "ETP" "Ertapenem" "Anaerobes, Grampos" 1 1 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H.influenzae" "10ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "H.influenzae" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M.catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ETP" "Ertapenem" "M.catarrhalis" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "ETP" "Ertapenem" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" "30ug" 24 21 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Enterobacteriaceae" 1 4 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H.influenzae" "30ug" 27 27 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "H.influenzae" 0.25 0.25 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M.catarrhalis" "30ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "FEP" "Cefepime" "M.catarrhalis" 4 4 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseud" "30ug" 18 18 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "FEP" "Cefepime" "Pseud" 8 8 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Pneumo" 1 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" "30ug" 25 25 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Viridans strept" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "FEP" "Cefepime" 4 8 FALSE +"EUCAST 2013" "MIC" "F_CANDD" "Candida" 3 "FLU" "Fluconazole" "Candida" 2 4 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOS" "Fosfomycin" "Enterobacteriaceae" 32 32 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "FOS" "Fosfomycin" "Staphs" 32 32 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" "30ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Enterobacteriaceae" 8 1024 FALSE +"EUCAST 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 25 25 FALSE +"EUCAST 2013" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2013" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Staphs" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "FOX" "Cefoxitin" "Staphs" "30ug" 22 22 FALSE +"EUCAST 2013" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "FUS" "Fusidic acid" "C.difficile" 2 1024 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" "10ug" 24 24 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "FUS" "Fusidic acid" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Enterococcus" 128 128 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetob" "10ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Acinetob" 4 4 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" "30ug" 8 8 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Enterococcus" 128 128 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseud" "10ug" 15 15 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "GEN" "Gentamicin" "Pseud" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2013" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "GEN" "Gentamicin" "Staphs" 1 1 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "GEN" "Gentamicin" 2 4 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetob" "10ug" 23 17 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Acinetob" 2 8 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" "10ug" 21 18 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "IPM" "Imipenem" "Enterococcus" 4 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "IPM" "Imipenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H.influenzae" "10ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "H.influenzae" 2 2 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M.catarrhalis" "10ug" 29 29 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "IPM" "Imipenem" "M.catarrhalis" 2 2 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseud" "10ug" 20 17 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "IPM" "Imipenem" "Pseud" 4 8 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Pneumo" 2 2 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "IPM" "Imipenem" "Viridans strept" 2 2 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "IPM" "Imipenem" 2 8 FALSE +"EUCAST 2013" "MIC" "F_ASPRG" "Aspergillus" 3 "ITR" "Itraconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" "30ug" 14 14 TRUE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LEX" "Cefalexin" "Enterobacteriaceae" 16 16 TRUE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" "10ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Enterococcus" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" "10ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Staphs" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strept A,B,C,G" "10ug" 19 16 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Strept A,B,C,G" 2 4 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" "10ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Pneumo" 2 4 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "LNZ" "Linezolid" 2 4 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetob" "5ug" 21 18 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Acinetob" 1 2 FALSE +"EUCAST 2013" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "LVX" "Levofloxacin" "H.pylori" 1 1 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H.influenzae" "5ug" 26 26 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "H.influenzae" 1 1 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M.catarrhalis" "5ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M.catarrhalis" 1 1 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseud" "5ug" 20 17 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "LVX" "Levofloxacin" "Pseud" 1 2 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella" "5ug" 27 27 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "LVX" "Levofloxacin" "Pasteurella" 0.064 0.064 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Staphs" "5ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Staphs" 1 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strept A,B,C,G" "5ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Strept A,B,C,G" 1 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" "5ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Pneumo" 2 2 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "LVX" "Levofloxacin" 1 2 FALSE +"EUCAST 2013" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2013" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2013" "DISK" "UTI" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2013" "MIC" "UTI" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2013" "DISK" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "MEC" "Mecillinam" "Enterobacteriaceae" "10ug" 15 15 TRUE +"EUCAST 2013" "MIC" "UTI" "B_PROTS_MRBL" "Proteus mirabilis" 2 "MEC" "Mecillinam" "Enterobacteriaceae" 8 8 TRUE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" "10ug" 22 16 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Enterobacteriaceae" 2 8 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetob" "10ug" 21 15 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Acinetob" 2 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Anaerobes, Gramneg" 2 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MEM" "Meropenem" "Anaerobes, Grampos" 2 8 FALSE +"EUCAST 2013" "DISK" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H.influenzae" "10ug" 20 20 FALSE +"EUCAST 2013" "MIC" "Non-meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H.influenzae" 2 2 FALSE +"EUCAST 2013" "MIC" "Meningitis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "H.influenzae" 0.25 1 FALSE +"EUCAST 2013" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria" "10ug" 26 26 FALSE +"EUCAST 2013" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "Listeria" 0.25 0.25 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M.catarrhalis" "10ug" 33 33 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MEM" "Meropenem" "M.catarrhalis" 2 2 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "N.meningitidis" 0.25 0.25 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseud" "10ug" 24 18 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "MEM" "Meropenem" "Pseud" 2 8 FALSE +"EUCAST 2013" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 0.25 1 FALSE +"EUCAST 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Pneumo" 2 2 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Viridans strept" 2 2 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "MEM" "Meropenem" 2 8 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" "5ug" 20 17 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MFX" "Moxifloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MFX" "Moxifloxacin" "C.difficile" 4 1024 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H.influenzae" "5ug" 25 25 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "H.influenzae" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M.catarrhalis" "5ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MFX" "Moxifloxacin" "M.catarrhalis" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Staphs" "5ug" 24 21 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Staphs" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strept A,B,C,G" "5ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "MFX" "Moxifloxacin" "Strept A,B,C,G" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" "5ug" 22 22 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Pneumo" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "MFX" "Moxifloxacin" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H.influenzae" "30ug" 24 21 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MNO" "Minocycline" "H.influenzae" 1 2 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M.catarrhalis" "30ug" 25 22 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "MNO" "Minocycline" "M.catarrhalis" 1 2 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "N.meningitidis" 1 2 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" "30ug" 23 20 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Staphs" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strept A,B,C,G" "30ug" 23 20 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "MNO" "Minocycline" "Strept A,B,C,G" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" "30ug" 24 21 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MNO" "Minocycline" "Pneumo" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "MTR" "Metronidazole" "C.difficile" 2 2 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MTR" "Metronidazole" "Anaerobes, Gramneg" 4 4 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "MTR" "Metronidazole" "Anaerobes, Grampos" 4 4 FALSE +"EUCAST 2013" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "MTR" "Metronidazole" "H.pylori" 8 8 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "MUP" "Mupirocin" "Staphs" "200ug" 30 18 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "MUP" "Mupirocin" "Staphs" 1 256 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "NAL" "Nalidixic acid" "H.influenzae" "30ug" 23 23 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "NAL" "Nalidixic acid" "M.catarrhalis" "30ug" 23 23 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "NAL" "Nalidixic acid" "Pasteurella" "30ug" 23 23 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" "10ug" 15 12 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetob" "10ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Acinetob" 4 4 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseud" "10ug" 12 12 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "NET" "Netilmicin" "Pseud" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2013" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "NET" "Netilmicin" "Staphs" 1 1 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "NET" "Netilmicin" 2 4 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" "100ug" 11 11 TRUE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Enterobacteriaceae" 64 64 TRUE +"EUCAST 2013" "DISK" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" "100ug" 15 15 TRUE +"EUCAST 2013" "MIC" "UTI" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "NIT" "Nitrofurantoin" "Enterococcus" 64 64 TRUE +"EUCAST 2013" "DISK" "UTI" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "NIT" "Nitrofurantoin" "Staphs" "100ug" 13 13 TRUE +"EUCAST 2013" "MIC" "UTI" "B_STPHY_SPRP_SPRP" "Staphylococcus saprophyticus saprophyticus" 1 "NIT" "Nitrofurantoin" "Staphs" 64 64 TRUE +"EUCAST 2013" "DISK" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strept A,B,C,G" "100ug" 15 15 TRUE +"EUCAST 2013" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "NIT" "Nitrofurantoin" "Strept A,B,C,G" 64 64 TRUE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" "10ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Staphs" "10ug" 17 17 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "NOR" "Norfloxacin" "Strept A,B,C,G" "10ug" 12 12 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "NOR" "Norfloxacin" "Pneumo" "10ug" 12 12 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "NOR" "Norfloxacin" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" "5ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Enterobacteriaceae" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H.influenzae" "5ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "H.influenzae" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M.catarrhalis" "5ug" 25 25 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "OFX" "Ofloxacin" "M.catarrhalis" 0.5 0.5 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "N.gonorrhoeae" 0.125 0.25 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Staphs" "5ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Pneumo" "5ug" 50 13 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Pneumo" 0.125 4 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "OFX" "Ofloxacin" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2013" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "OXA" "Oxacillin" "Staphs" 0.25 0.25 FALSE +"EUCAST 2013" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Staphs" 2 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Pneumo" "1ug" 20 20 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Gramneg" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PEN" "Benzylpenicillin" "Anaerobes, Grampos" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "PEN" "Benzylpenicillin" "H.influenzae" "1 unit" 12 12 FALSE +"EUCAST 2013" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria" "1 unit" 13 13 FALSE +"EUCAST 2013" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "Listeria" 1 1 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "N.gonorrhoeae" 0.064 1 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "N.meningitidis" 0.064 0.25 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella" "1 unit" 17 17 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "PEN" "Benzylpenicillin" "Pasteurella" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" "1 unit" 26 26 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "PEN" "Benzylpenicillin" "Staphs" 0.125 0.125 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strept A,B,C,G" "1 unit" 18 18 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Strept A,B,C,G" 0.25 0.25 FALSE +"EUCAST 2013" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Pneumo" 0.064 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" "1 unit" 18 12 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Viridans strept" 0.25 2 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "PEN" "Benzylpenicillin" 0.25 2 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" "30ug" 20 17 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "PIP" "Piperacillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseud" "30ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "PIP" "Piperacillin" "Pseud" 16 16 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "PIP" "Piperacillin" 4 16 FALSE +"EUCAST 2013" "MIC" "F_ASPRG" "Aspergillus" 3 "POS" "Posaconazole" "Aspergillus" 0.125 0.125 FALSE +"EUCAST 2013" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "POS" "Posaconazole" "Candida" 0.064 0.064 FALSE +"EUCAST 2013" "DISK" "B_ENTRC_FACM" "Enterococcus faecium" 2 "QDA" "Quinupristin/dalfopristin" "Enterococcus" "15ug" 22 20 FALSE +"EUCAST 2013" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "QDA" "Quinupristin/dalfopristin" "Enterococcus" 1 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" "15ug" 21 18 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "QDA" "Quinupristin/dalfopristin" "Staphs" 1 2 FALSE +"EUCAST 2013" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "RIF" "Rifampicin" "C.difficile" 0.004 1024 FALSE +"EUCAST 2013" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "RIF" "Rifampicin" "H.pylori" 1 1 FALSE +"EUCAST 2013" "DISK" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H.influenzae" "5ug" 18 18 FALSE +"EUCAST 2013" "MIC" "Prophylaxis" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "H.influenzae" 1 1 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "N.meningitidis" 0.25 0.25 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" "5ug" 26 23 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Staphs" 0.064 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strept A,B,C,G" "5ug" 21 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "RIF" "Rifampicin" "Strept A,B,C,G" 0.064 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" "5ug" 22 17 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Pneumo" 0.064 0.5 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RXT" "Roxithromycin" "H.influenzae" 1 16 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RXT" "Roxithromycin" "M.catarrhalis" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "RXT" "Roxithromycin" "Staphs" 1 2 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "RXT" "Roxithromycin" "Strept A,B,C,G" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RXT" "Roxithromycin" "Pneumo" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" "10ug/10ug" 14 14 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Enterobacteriaceae" 8 8 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "SAM" "Ampicillin/sulbactam" "Enterococcus" 4 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Gramneg" 4 8 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "SAM" "Ampicillin/sulbactam" "Anaerobes, Grampos" 4 8 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SAM" "Ampicillin/sulbactam" "H.influenzae" 1 1 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SAM" "Ampicillin/sulbactam" "M.catarrhalis" 1 1 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "SAM" "Ampicillin/sulbactam" 2 8 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "N.gonorrhoeae" 64 64 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" "300ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Enterococcus" 512 512 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" "300ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Enterococcus" 512 512 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" "1.25ug/23.75ug" 16 13 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetob" "1.25ug/23.75ug" 16 13 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Acinetob" 2 4 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" "1.25ug/23.75ug" 50 21 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Enterococcus" 0.032 1 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H.influenzae" "1.25ug/23.75ug" 23 20 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "H.influenzae" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria" "1.25ug/23.75ug" 29 29 FALSE +"EUCAST 2013" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Listeria" 0.064 0.064 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M.catarrhalis" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M.catarrhalis" 0.5 1 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella" "1.25ug/23.75ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pasteurella" 0.25 0.25 FALSE +"EUCAST 2013" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "S.maltophilia" "1.25ug/23.75ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "S.maltophilia" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" "1.25ug/23.75ug" 17 14 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Staphs" 2 4 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strept A,B,C,G" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Strept A,B,C,G" 1 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" "1.25ug/23.75ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Pneumo" 1 2 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" "75/10-15ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseud" "75/10-15ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "TCC" "Ticarcillin/clavulanic acid" "Pseud" 16 16 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "TCC" "Ticarcillin/clavulanic acid" 8 16 FALSE +"EUCAST 2013" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter" "30ug" 30 30 FALSE +"EUCAST 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "Campylobacter" 2 2 FALSE +"EUCAST 2013" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "TCY" "Tetracycline" "H.pylori" 1 1 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H.influenzae" "30ug" 25 22 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "H.influenzae" 1 2 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M.catarrhalis" "30ug" 28 25 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M.catarrhalis" 1 2 FALSE +"EUCAST 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "N.gonorrhoeae" 0.5 1 FALSE +"EUCAST 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "TCY" "Tetracycline" "N.meningitidis" 1 2 FALSE +"EUCAST 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TCY" "Tetracycline" "Pasteurella" "30ug" 24 24 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" "30ug" 22 19 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Staphs" 1 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strept A,B,C,G" "30ug" 23 20 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Strept A,B,C,G" 1 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" "30ug" 25 22 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Pneumo" 1 2 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" "30ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Enterococcus" 2 2 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TEC" "Teicoplanin" "Staphs" 2 2 FALSE +"EUCAST 2013" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TEC" "Teicoplanin" "Staphs" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strept A,B,C,G" "30ug" 15 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "TEC" "Teicoplanin" "Strept A,B,C,G" 2 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" "30ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TEC" "Teicoplanin" "Pneumo" 2 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" "30ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TEC" "Teicoplanin" "Viridans strept" 2 2 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" "15ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TGC" "Tigecycline" "Enterobacteriaceae" 1 2 FALSE +"EUCAST 2013" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "TGC" "Tigecycline" "C.difficile" 0.25 1024 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" "15ug" 18 15 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "TGC" "Tigecycline" "Enterococcus" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" "15ug" 18 18 FALSE +"EUCAST 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "TGC" "Tigecycline" "Staphs" 0.5 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strept A,B,C,G" "15ug" 19 16 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "TGC" "Tigecycline" "Strept A,B,C,G" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "TGC" "Tigecycline" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" "75ug" 23 23 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TIC" "Ticarcillin" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Anaerobes, Gramneg" 16 16 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TIC" "Ticarcillin" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseud" "75ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "TIC" "Ticarcillin" "Pseud" 16 16 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "TIC" "Ticarcillin" 8 16 FALSE +"EUCAST 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TLT" "Telithromycin" "H.influenzae" "15ug" 50 12 FALSE +"EUCAST 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TLT" "Telithromycin" "H.influenzae" 0.125 8 FALSE +"EUCAST 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M.catarrhalis" "15ug" 23 20 FALSE +"EUCAST 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TLT" "Telithromycin" "M.catarrhalis" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strept A,B,C,G" "15ug" 20 17 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "TLT" "Telithromycin" "Strept A,B,C,G" 0.25 0.5 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" "15ug" 23 20 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Pneumo" 0.25 0.5 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" "5ug" 18 15 TRUE +"EUCAST 2013" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Enterobacteriaceae" 2 4 TRUE +"EUCAST 2013" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" "5ug" 50 21 TRUE +"EUCAST 2013" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "TMP" "Trimethoprim" "Enterococcus" 0.032 1 TRUE +"EUCAST 2013" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" "5ug" 17 14 TRUE +"EUCAST 2013" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Staphs" 2 4 TRUE +"EUCAST 2013" "MIC" "UTI" "B_STRPT_GRPB" "Streptococcus Group B" 2 "TMP" "Trimethoprim" "Strept A,B,C,G" 2 2 TRUE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" "10ug" 17 14 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Enterobacteriaceae" 2 4 FALSE +"EUCAST 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetob" "10ug" 17 17 FALSE +"EUCAST 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Acinetob" 4 4 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseud" "10ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "TOB" "Tobramycin" "Pseud" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" "10ug" 18 18 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2013" "DISK" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" "10ug" 22 22 FALSE +"EUCAST 2013" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "TOB" "Tobramycin" "Staphs" 1 1 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "TOB" "Tobramycin" 2 4 FALSE +"EUCAST 2013" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" "30ug/6ug" 20 17 FALSE +"EUCAST 2013" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Enterobacteriaceae" 8 16 FALSE +"EUCAST 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Gramneg" 8 16 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "TZP" "Piperacillin/tazobactam" "Anaerobes, Grampos" 8 16 FALSE +"EUCAST 2013" "DISK" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseud" "30ug/6ug" 19 19 FALSE +"EUCAST 2013" "MIC" "B_PSDMN" "Pseudomonas" 3 "TZP" "Piperacillin/tazobactam" "Pseud" 16 16 FALSE +"EUCAST 2013" "MIC" "UNKNOWN" "(unknown name)" 6 "TZP" "Piperacillin/tazobactam" 4 16 FALSE +"EUCAST 2013" "MIC" "B_CRDDS_DFFC" "Clostridioides difficile" 2 "VAN" "Vancomycin" "C.difficile" 2 2 FALSE +"EUCAST 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" "5ug" 12 12 FALSE +"EUCAST 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Enterococcus" 4 4 FALSE +"EUCAST 2013" "MIC" "B_GRAMP" "(unknown Gram-positives)" 6 "VAN" "Vancomycin" "Anaerobes, Grampos" 2 2 FALSE +"EUCAST 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Staphs" 2 2 FALSE +"EUCAST 2013" "MIC" "B_STPHY_CONS" "Coagulase-negative Staphylococcus (CoNS)" 2 "VAN" "Vancomycin" "Staphs" 4 4 FALSE +"EUCAST 2013" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strept A,B,C,G" "5ug" 13 13 FALSE +"EUCAST 2013" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Strept A,B,C,G" 2 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" "5ug" 16 16 FALSE +"EUCAST 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Pneumo" 2 2 FALSE +"EUCAST 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" "5ug" 15 15 FALSE +"EUCAST 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Viridans strept" 2 2 FALSE +"EUCAST 2013" "MIC" "F_ASPRG" "Aspergillus" 3 "VOR" "Voriconazole" "Aspergillus" 1 2 FALSE +"EUCAST 2013" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2013" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"EUCAST 2013" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Candida" 0.125 0.125 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Table 2A" "20ug/10ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 21" 8 32 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 2 8 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 2 8 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" "20ug/10ug" 24 23 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 4 8 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 17" "20ug/10ug" 27 27 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 20" "20ug/10ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Table 2A" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Table 2A" 16 64 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 4" 16 64 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "AMK" "Amikacin" "M45 Table 20" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "AMK" "Amikacin" "M45 Table 20" 16 64 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Table 2A" "10ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 4" 0.25 0.5 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "AMP" "Ampicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2022" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2022" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 17" "10ug" 27 27 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "AMP" "Ampicillin" "M45 Table 20" "10ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "AMP" "Ampicillin" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "AMX" "Amoxicillin" "M45 Table 21" 0.125 0.25 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2022" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "ANI" "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Table 2A" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 3" 4 16 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 16" "15ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "Table 2F" "15ug" 30 30 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "Table 2F" 1 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 17" "15ug" 20 20 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 17" 1 2048 FALSE +"CLSI 2022" "DISK" "B_SHGLL" "Shigella" 3 "AZM" "Azithromycin" "Table 2A" "15ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_SHGLL" "Shigella" 3 "AZM" "Azithromycin" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2022" "MIC" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "AZM" "Azithromycin" "M45 Table 20" 2 2048 FALSE +"CLSI 2022" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "CAS" "Caspofungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2022" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2022" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "CAS" "Caspofungin" "Table 1" "5ug" 13 10 FALSE +"CLSI 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "CAS" "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "CAS" "Caspofungin" "Table 1" "5ug" 13 10 FALSE +"CLSI 2022" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "CAS" "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAT" "Cefetamet" "Table 2A" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAT" "Cefetamet" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Table 2A" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 3" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 21" 8 32 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "CAZ" "Ceftazidime" "M45 Table 20" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "CAZ" "Ceftazidime" "M45 Table 20" 4 16 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CDR" "Cefdinir" "Table 2A" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CDR" "Cefdinir" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CEC" "Cefaclor" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CEC" "Cefaclor" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 16" 8 32 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Table 2A" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFP" "Cefoperazone" "Table 2A" "75ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFP" "Cefoperazone" "Table 2A" 16 64 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Table 2A" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 4" 8 32 FALSE +"CLSI 2022" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2022" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 21" 8 2048 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 13" 8 32 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 2 8 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2022" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 18" 8 32 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 17" "30ug" 28 28 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 17" 2 2048 FALSE +"CLSI 2022" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "CHL" "Chloramphenicol" "M45 Table 20" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "CHL" "Chloramphenicol" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 21" 8 32 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CID" "Cefonicid" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CID" "Cefonicid" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIN" "Cinoxacin" "Table 2A" "100ug" 19 14 TRUE +"CLSI 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIN" "Cinoxacin" "Table 2A" 16 64 TRUE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 26 21 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 4" 1 4 FALSE +"CLSI 2022" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 5" "5ug" 24 20 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 5" 1 4 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2022" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 1 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 25 18 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2022" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "CIP" "Ciprofloxacin" "M45 Table 20" "5ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "CIP" "Ciprofloxacin" "M45 Table 20" 1 4 FALSE +"CLSI 2022" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 4" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 6" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_GEMLL" "Gemella" 3 "CLI" "Clindamycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 11" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_MCRCCC" "Micrococcus" 3 "CLI" "Clindamycin" "M45 Table 15" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 16" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "CLI" "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2022" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 10" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 16" "15ug" 24 24 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 16" 1 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CMZ" "Cefmetazole" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CMZ" "Cefmetazole" "Table 2A" 16 64 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Table 2A" 0.001 4 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 0.001 4 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 0.001 4 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Table 2A" "10ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Table 2A" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPR" "Cefprozil" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPR" "Cefprozil" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Table 2A" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 6" 1 4 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "B_GEMLL" "Gemella" 3 "CRO" "Ceftriaxone" "M45 Table 8" 1 4 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "CRO" "Ceftriaxone" "M45 Table 12" 1 4 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 17" "30ug" 34 34 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 17" 0.125 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Table 2A" "30ug" 21 17 TRUE +"CLSI 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Table 2A" 8 32 TRUE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTT" "Cefotetan" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTT" "Cefotetan" "Table 2A" 16 64 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Table 2A" "30ug" 26 22 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 6" 1 4 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "B_GEMLL" "Gemella" 3 "CTX" "Cefotaxime" "M45 Table 8" 1 4 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "CTX" "Cefotaxime" "M45 Table 20" "30ug" 26 22 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "CTX" "Cefotaxime" "M45 Table 20" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" "30ug" 23 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" 4 32 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 3" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2022" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 16" 4 16 FALSE +"CLSI 2022" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "CXM" "Cefuroxime" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "CXM" "Cefuroxime" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Table 2A" "30ug/20ug" 21 20 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Table 2A" 8 16 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" "30ug" 21 20 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE +"CLSI 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 2 8 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "CZO" "Cefazolin" "M45 Table 20" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Table 2A" "30ug/10ug" 22 18 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Table 2A" 2 8 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CZT" "Ceftolozane/tazobactam" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CZT" "Ceftolozane/tazobactam" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Table 2B-1" "30ug/10ug" 21 16 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Table 2B-1" 4 16 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZT" "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZX" "Ceftizoxime" "Table 2A" "30ug" 25 21 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZX" "Ceftizoxime" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "DAL" "Dalbavancin" "Table 2D" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "DAL" "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "DAL" "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 6" 1 2048 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 2 8 FALSE +"CLSI 2022" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "DAP" "Daptomycin" "Table 2D" 0.001 8 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 11" 4 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "DOR" "Doripenem" "M45 Table 3" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "DOR" "Doripenem" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOX" "Doxycycline" "Table 2A" "30ug" 14 10 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOX" "Doxycycline" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2022" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 2 8 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 6" 4 16 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2022" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 17" "30ug" 23 23 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "DOX" "Doxycycline" "M45 Table 20" 4 16 FALSE +"CLSI 2022" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ENX" "Enoxacin" "Table 2A" "10ug" 18 14 TRUE +"CLSI 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ENX" "Enoxacin" "Table 2A" 2 8 TRUE +"CLSI 2022" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 TRUE +"CLSI 2022" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 TRUE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 4" 0.5 8 FALSE +"CLSI 2022" "DISK" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" "15ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 8 32 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 6" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2022" "MIC" "B_GEMLL" "Gemella" 3 "ERY" "Erythromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 11" 0.5 8 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "ERY" "Erythromycin" "M45 Table 12" 0.5 8 FALSE +"CLSI 2022" "MIC" "B_MCRCCC" "Micrococcus" 3 "ERY" "Erythromycin" "M45 Table 15" 0.5 8 FALSE +"CLSI 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 16" "15ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 17" "15ug" 27 24 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 17" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "ERY" "Erythromycin" "M45 Table 19" 0.5 8 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Table 2A" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Table 2A" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 3" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Table 2A" "30ug" 16 8 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FDC" "Cefiderocol" "Table 2B-2" "30ug" 15 15 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FDC" "Cefiderocol" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Table 2B-1" "30ug" 18 12 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Table 2B-1" 4 16 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "FDC" "Cefiderocol" "Table 2B-4" "30ug" 15 15 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "FDC" "Cefiderocol" "Table 2B-4" 1 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Table 2A" "30ug" 25 18 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Table 2A" 2 16 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 3" 2 16 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 6" 1 4 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2022" "DISK" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "FEP" "Cefepime" "M45 Table 20" "30ug" 25 18 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "FEP" "Cefepime" "M45 Table 20" 2 16 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FLE" "Fleroxacin" "Table 2A" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FLE" "Fleroxacin" "Table 2A" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2022" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Table 1" "25ug" 50 14 FALSE +"CLSI 2022" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Table 1" 0.001 64 FALSE +"CLSI 2022" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2022" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Table 2A" "200ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Table 2A" 64 256 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 3" 8 32 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2022" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2022" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "FOX" "Cefoxitin" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "FOX" "Cefoxitin" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GAT" "Gatifloxacin" "Table 2A" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GAT" "Gatifloxacin" "Table 2A" 2 8 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2022" "DISK" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "GEM" "Gemifloxacin" "Table 2A" "5ug" 20 15 FALSE +"CLSI 2022" "MIC" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "GEM" "Gemifloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Table 2A" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 4" 4 16 FALSE +"CLSI 2022" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 6" 4 16 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2022" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 11" 4 16 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "GEN" "Gentamicin" "M45 Table 20" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "GEN" "Gentamicin" "M45 Table 20" 4 16 FALSE +"CLSI 2022" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GRX" "Grepafloxacin" "Table 2A" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GRX" "Grepafloxacin" "Table 2A" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IMR" "Imipenem/relebactam" "Table 2A" "10ug/25ug" 25 20 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IMR" "Imipenem/relebactam" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IMR" "Imipenem/relebactam" "Table 2J" 4 16 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Table 2B-1" "10ug/25ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 4" 4 16 FALSE +"CLSI 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 11" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 18" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "IPM" "Imipenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "IPM" "Imipenem" "M45 Table 20" 1 4 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "KAN" "Kanamycin" "Table 2A" "30ug" 18 13 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "KAN" "Kanamycin" "Table 2A" 16 64 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LMU" "Lefamulin" "Table 2E" "20ug" 18 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LMU" "Lefamulin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "LMU" "Lefamulin" "Table 2E" "20ug" 18 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "LMU" "Lefamulin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LMU" "Lefamulin" "Table 2C" "20ug" 23 23 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LMU" "Lefamulin" "Table 2C" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LMU" "Lefamulin" "Table 2C" "20ug" 23 23 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LMU" "Lefamulin" "Table 2C" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LMU" "Lefamulin" "Table 2G" "20ug" 19 19 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LMU" "Lefamulin" "Table 2G" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "LNZ" "Linezolid" "M45 Table 2" 2 2048 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 6" 2 2048 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 11" 4 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOM" "Lomefloxacin" "Table 2A" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOM" "Lomefloxacin" "Table 2A" 2 8 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 TRUE +"CLSI 2022" "MIC" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 TRUE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOR" "Loracarbef" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOR" "Loracarbef" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LTM" "Latamoxef" "Table 2A" "30ug" 23 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LTM" "Latamoxef" "Table 2A" 8 64 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2022" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Table 2A" "5ug" 21 16 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Table 2A" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 4" 2 8 FALSE +"CLSI 2022" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2022" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_GEMLL" "Gemella" 3 "LVX" "Levofloxacin" "M45 Table 8" 2 8 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "LVX" "Levofloxacin" "M45 Table 12" 2 8 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 16" 2 2048 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 22 14 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 17" "5ug" 28 28 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2022" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "LVX" "Levofloxacin" "M45 Table 19" 1 4 FALSE +"CLSI 2022" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2022" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "LVX" "Levofloxacin" "M45 Table 20" "5ug" 17 13 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "LVX" "Levofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2022" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MAN" "Cefamandole" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MAN" "Cefamandole" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2022" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Table 2A" "10ug" 15 11 TRUE +"CLSI 2022" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Table 2A" 8 32 TRUE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Table 2A" 1 4 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "M45 Table 2" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 3" 1 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 9" 4 16 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "MEM" "Meropenem" "M45 Table 4" 4 16 FALSE +"CLSI 2022" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2022" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 6" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_GEMLL" "Gemella" 3 "MEM" "Meropenem" "M45 Table 8" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "MEM" "Meropenem" "M45 Table 11" 1 4 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "MEM" "Meropenem" "M45 Table 12" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "M45 Table 14" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "MEM" "Meropenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "MEM" "Meropenem" "M45 Table 20" 1 4 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Table 2A" "20ug/10ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 17" "5ug" 28 28 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Table 1" "10ug" 30 27 FALSE +"CLSI 2022" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Table 1" 0.064 0.25 FALSE +"CLSI 2022" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2022" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Table 1" "10ug" 16 13 FALSE +"CLSI 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2022" "DISK" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "MIF" "Micafungin" "Table 1" "10ug" 16 13 FALSE +"CLSI 2022" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "MIF" "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MNO" "Minocycline" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MNO" "Minocycline" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 13" 4 16 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2022" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NAL" "Nalidixic acid" "Table 2A" "30ug" 19 13 TRUE +"CLSI 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NAL" "Nalidixic acid" "Table 2A" 16 32 TRUE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Table 2A" "30ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Table 2A" 8 32 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Table 2A" "300ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Table 2A" 32 128 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2022" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Table 2A" "10ug" 17 12 TRUE +"CLSI 2022" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Table 2A" 4 16 TRUE +"CLSI 2022" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 TRUE +"CLSI 2022" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 TRUE +"CLSI 2022" "MIC" "UTI" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 TRUE +"CLSI 2022" "DISK" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 TRUE +"CLSI 2022" "MIC" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 TRUE +"CLSI 2022" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 TRUE +"CLSI 2022" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 TRUE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Table 2A" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Table 2A" 2 8 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2022" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "OFX" "Ofloxacin" "M45 Table 20" "5ug" 16 12 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "OFX" "Ofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "ORI" "Oritavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ORI" "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ORI" "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2022" "DISK" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2022" "MIC" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2022" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2022" "DISK" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2022" "MIC" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2022" "DISK" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2022" "MIC" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2022" "DISK" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 2" 0.125 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 4" 0.125 0.25 FALSE +"CLSI 2022" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 21" 0.5 1 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 4 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2022" "MIC" "B_GEMLL" "Gemella" 3 "PEN" "Benzylpenicillin" "M45 Table 8" 0.125 4 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2022" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2022" "MIC" "B_MCRCCC" "Micrococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 15" 0.125 0.25 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2022" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 17" "10 units" 25 25 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "PEN" "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2022" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2022" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2022" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2022" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "PIP" "Piperacillin" "M45 Table 20" "100ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "PIP" "Piperacillin" "M45 Table 20" 16 128 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PLB" "Polymyxin B" "Table 2A" 0.001 4 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 0.001 4 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 0.001 8 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 6" 1 4 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2022" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 4" 1 4 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 6" 1 4 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 16" 1 4 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Table 2A" "10ug/10ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Table 2A" 16 32 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 20" "10ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 20" 8 32 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SMX" "Sulfamethoxazole" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SMX" "Sulfamethoxazole" "Table 2A" 256 512 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug/300ug" 17 12 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "SMX" "Sulfamethoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SOX" "Sulfisoxazole" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SOX" "Sulfisoxazole" "Table 2A" 256 512 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug/300ug" 17 12 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "SOX" "Sulfisoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SSS" "Sulfonamide" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SSS" "Sulfonamide" "Table 2A" 256 512 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "SSS" "Sulfonamide" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "SSS" "Sulfonamide" "M45 Table 20" 256 512 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "STR" "Streptoduocin" "Table 2A" "10ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2022" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2022" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2A" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2A" 2 4 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 4" 2 4 FALSE +"CLSI 2022" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 2048 FALSE +"CLSI 2022" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 6" 2 4 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 2 4 FALSE +"CLSI 2022" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 0.5 4 FALSE +"CLSI 2022" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2022" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 17" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE +"CLSI 2022" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 20" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 20" 2 4 FALSE +"CLSI 2022" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Table 2A" "75/10-15ug" 20 14 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Table 2A" 16 128 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2022" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2022" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCY" "Tetracycline" "Table 2A" "30ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCY" "Tetracycline" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "TCY" "Tetracycline" "M45 Table 2" 2 8 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2022" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 4" 4 16 FALSE +"CLSI 2022" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2022" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 5" "30ug" 26 22 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 5" 4 16 FALSE +"CLSI 2022" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2022" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2022" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2022" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 16" "30ug" 29 24 FALSE +"CLSI 2022" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 16" 2 8 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2022" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 17" "30ug" 23 23 FALSE +"CLSI 2022" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 17" 1 2048 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "TCY" "Tetracycline" "M45 Table 20" "30ug" 15 11 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "TCY" "Tetracycline" "M45 Table 20" 4 16 FALSE +"CLSI 2022" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "TLV" "Telavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TLV" "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TLV" "Telavancin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TLV" "Telavancin" "Table 2H-2" 0.125 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Table 2A" "5ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Table 2A" 8 16 FALSE +"CLSI 2022" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Table 2A" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Table 2A" 4 16 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2022" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2022" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "TZD" "Tedizolid" "Table 2D" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TZD" "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TZD" "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2022" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Table 2A" "100ug/10ug" 25 20 FALSE +"CLSI 2022" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Table 2A" 8 32 FALSE +"CLSI 2022" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2022" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 3" 16 128 FALSE +"CLSI 2022" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 16 128 FALSE +"CLSI 2022" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2022" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2022" "DISK" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2022" "MIC" "B_HMPHL_PRNF" "Haemophilus parainfluenzae" 2 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2022" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2022" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2022" "DISK" "B_VIBRI" "Vibrio" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 20" "100ug/10ug" 21 17 FALSE +"CLSI 2022" "MIC" "B_VIBRI" "Vibrio" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 20" 16 128 FALSE +"CLSI 2022" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2022" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "M45 Table 2" 1 2048 FALSE +"CLSI 2022" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 4" 4 2048 FALSE +"CLSI 2022" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 6" 2 2048 FALSE +"CLSI 2022" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2022" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2022" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2022" "MIC" "B_GEMLL" "Gemella" 3 "VAN" "Vancomycin" "M45 Table 8" 1 2048 FALSE +"CLSI 2022" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2022" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 11" 2 16 FALSE +"CLSI 2022" "MIC" "B_LCTCC" "Lactococcus" 3 "VAN" "Vancomycin" "M45 Table 12" 2 4 FALSE +"CLSI 2022" "MIC" "B_MCRCCC" "Micrococcus" 3 "VAN" "Vancomycin" "M45 Table 15" 2 2048 FALSE +"CLSI 2022" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "VAN" "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2022" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2022" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2022" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2022" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2022" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2022" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2022" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2022" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2022" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "M61 Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2022" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2022" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "VOR" "Voriconazole" "Table 1" "1ug" 15 12 FALSE +"CLSI 2022" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "VOR" "Voriconazole" "Table 1" 0.5 2 FALSE +"CLSI 2022" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2022" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2022" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2022" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Table 2A" "20ug/10ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Table 2A" 8 32 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 21" 8 32 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" "20ug/10ug" 24 23 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 4 8 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 17" "20ug/10ug" 27 27 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 20" "20ug/10ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 20" 8 32 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Table 2A" "30ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Table 2A" 16 64 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 4" 16 64 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "AMK" "Amikacin" "M45 Table 20" "30ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "AMK" "Amikacin" "M45 Table 20" 16 64 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Table 2A" "10ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Table 2A" 8 32 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 4" 0.25 0.5 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "AMP" "Ampicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2021" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2021" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 17" "10ug" 27 27 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "AMP" "Ampicillin" "M45 Table 20" "10ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "AMP" "Ampicillin" "M45 Table 20" 8 32 FALSE +"CLSI 2021" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "AMX" "Amoxicillin" "M45 Table 21" 0.125 0.25 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2021" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "ANI" "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Table 2A" "30ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 3" 4 16 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 16" "15ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "Table 2F" "15ug" 30 30 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "Table 2F" 1 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 17" "15ug" 20 20 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 17" 1 2048 FALSE +"CLSI 2021" "DISK" "B_SHGLL" "Shigella" 3 "AZM" "Azithromycin" "Table 2A" "15ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_SHGLL" "Shigella" 3 "AZM" "Azithromycin" "Table 2A" 8 32 FALSE +"CLSI 2021" "DISK" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2021" "MIC" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "AZM" "Azithromycin" "M45 Table 20" 2 2048 FALSE +"CLSI 2021" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "CAS" "Caspofungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2021" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2021" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "CAS" "Caspofungin" "Table 1" "5ug" 13 10 FALSE +"CLSI 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "CAS" "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "DISK" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "CAS" "Caspofungin" "Table 1" "5ug" 13 10 FALSE +"CLSI 2021" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "CAS" "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAT" "Cefetamet" "Table 2A" "10ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAT" "Cefetamet" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Table 2A" "30ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 3" 4 16 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 21" 8 32 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 16" 2 2048 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "CAZ" "Ceftazidime" "M45 Table 20" "30ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "CAZ" "Ceftazidime" "M45 Table 20" 4 16 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CDR" "Cefdinir" "Table 2A" "5ug" 20 16 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CDR" "Cefdinir" "Table 2A" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CEC" "Cefaclor" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CEC" "Cefaclor" "Table 2A" 8 32 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 16" 8 32 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Table 2A" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Table 2A" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFP" "Cefoperazone" "Table 2A" "75ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFP" "Cefoperazone" "Table 2A" 16 64 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Table 2A" "30ug" 18 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Table 2A" 8 32 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 4" 8 32 FALSE +"CLSI 2021" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2021" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 21" 8 2048 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2021" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 13" 8 32 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 2 8 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2021" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 18" 8 32 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 17" "30ug" 28 28 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 17" 2 2048 FALSE +"CLSI 2021" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "CHL" "Chloramphenicol" "M45 Table 20" "30ug" 18 12 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "CHL" "Chloramphenicol" "M45 Table 20" 8 32 FALSE +"CLSI 2021" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 21" 8 32 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CID" "Cefonicid" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CID" "Cefonicid" "Table 2A" 8 32 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIN" "Cinoxacin" "Table 2A" "100ug" 19 14 TRUE +"CLSI 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIN" "Cinoxacin" "Table 2A" 16 64 TRUE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 26 21 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 4" 1 4 FALSE +"CLSI 2021" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 5" "5ug" 24 20 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 5" 1 4 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2021" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 1 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 25 18 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2021" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "CIP" "Ciprofloxacin" "M45 Table 20" "5ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "CIP" "Ciprofloxacin" "M45 Table 20" 1 4 FALSE +"CLSI 2021" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 4" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 6" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_GEMLL" "Gemella" 3 "CLI" "Clindamycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 11" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_MCRCCC" "Micrococcus" 3 "CLI" "Clindamycin" "M45 Table 15" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 16" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "CLI" "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2021" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 10" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 16" "15ug" 24 24 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 16" 1 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CMZ" "Cefmetazole" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CMZ" "Cefmetazole" "Table 2A" 16 64 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Table 2A" 0.001 4 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 0.001 4 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 0.001 4 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Table 2A" "10ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Table 2A" 2 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPR" "Cefprozil" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPR" "Cefprozil" "Table 2A" 8 32 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Table 2A" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2021" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Table 2A" 1 4 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 3" 1 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 6" 1 4 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2021" "MIC" "B_GEMLL" "Gemella" 3 "CRO" "Ceftriaxone" "M45 Table 8" 1 4 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "CRO" "Ceftriaxone" "M45 Table 12" 1 4 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 16" 2 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 17" "30ug" 34 34 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 17" 0.125 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Table 2A" "30ug" 21 17 TRUE +"CLSI 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Table 2A" 8 32 TRUE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTT" "Cefotetan" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTT" "Cefotetan" "Table 2A" 16 64 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Table 2A" "30ug" 26 22 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Table 2A" 1 4 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 3" 1 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 6" 1 4 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2021" "MIC" "B_GEMLL" "Gemella" 3 "CTX" "Cefotaxime" "M45 Table 8" 1 4 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 16" 2 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "CTX" "Cefotaxime" "M45 Table 20" "30ug" 26 22 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "CTX" "Cefotaxime" "M45 Table 20" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2021" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" "30ug" 23 14 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" 8 32 FALSE +"CLSI 2021" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" 4 32 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 3" 8 32 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2021" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 16" 4 16 FALSE +"CLSI 2021" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "CXM" "Cefuroxime" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "CXM" "Cefuroxime" "M45 Table 20" 8 32 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Table 2A" "30ug/20ug" 21 20 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Table 2A" 8 16 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" "30ug/20ug" 21 20 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE +"CLSI 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 2 8 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "CZO" "Cefazolin" "M45 Table 20" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Table 2A" "30ug/10ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Table 2A" 2 8 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CZT" "Ceftolozane/tazobactam" "Table 2E" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Table 2B-1" "30ug/10ug" 21 16 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Table 2B-1" 4 16 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZT" "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZX" "Ceftizoxime" "Table 2A" "30ug" 25 21 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZX" "Ceftizoxime" "Table 2A" 1 4 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "DAL" "Dalbavancin" "Table 2D" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "DAL" "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "DAL" "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 6" 1 2048 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 2 8 FALSE +"CLSI 2021" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "DAP" "Daptomycin" "Table 2D" 0.001 8 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 11" 4 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 4 8 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Table 2A" 1 4 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "DOR" "Doripenem" "M45 Table 3" "10ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "DOR" "Doripenem" "M45 Table 3" 1 4 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOX" "Doxycycline" "Table 2A" "30ug" 14 10 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOX" "Doxycycline" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2021" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2021" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 2 8 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 6" 4 16 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2021" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 17" "30ug" 23 23 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "DOX" "Doxycycline" "M45 Table 20" 4 16 FALSE +"CLSI 2021" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ENX" "Enoxacin" "Table 2A" "10ug" 18 14 TRUE +"CLSI 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ENX" "Enoxacin" "Table 2A" 2 8 TRUE +"CLSI 2021" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 TRUE +"CLSI 2021" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 TRUE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 4" 0.5 8 FALSE +"CLSI 2021" "DISK" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" "15ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 8 32 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 6" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2021" "MIC" "B_GEMLL" "Gemella" 3 "ERY" "Erythromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 11" 0.5 8 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "ERY" "Erythromycin" "M45 Table 12" 0.5 8 FALSE +"CLSI 2021" "MIC" "B_MCRCCC" "Micrococcus" 3 "ERY" "Erythromycin" "M45 Table 15" 0.5 8 FALSE +"CLSI 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 16" "15ug" 21 21 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 16" 2 2048 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 17" "15ug" 27 24 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 17" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "ERY" "Erythromycin" "M45 Table 19" 0.5 8 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Table 2A" "10ug" 22 18 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Table 2A" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 3" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Table 2A" "30ug" 16 11 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FDC" "Cefiderocol" "Table 2B-2" "30ug" 15 10 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FDC" "Cefiderocol" "Table 2B-2" 4 16 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Table 2B-1" "30ug" 18 12 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Table 2B-1" 4 16 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "FDC" "Cefiderocol" "Table 2B-4" "30ug" 17 12 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "FDC" "Cefiderocol" "Table 2B-4" 4 16 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Table 2A" "30ug" 25 18 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Table 2A" 2 16 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 3" 2 16 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 6" 1 4 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2021" "DISK" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "FEP" "Cefepime" "M45 Table 20" "30ug" 25 18 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "FEP" "Cefepime" "M45 Table 20" 2 16 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FLE" "Fleroxacin" "Table 2A" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FLE" "Fleroxacin" "Table 2A" 2 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2021" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Table 1" "25ug" 50 14 FALSE +"CLSI 2021" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Table 1" 0.001 64 FALSE +"CLSI 2021" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2021" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Table 2A" "200ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Table 2A" 64 256 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Table 2A" 8 32 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 3" 8 32 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2021" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2021" "DISK" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2021" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2021" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "FOX" "Cefoxitin" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "FOX" "Cefoxitin" "M45 Table 20" 8 32 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GAT" "Gatifloxacin" "Table 2A" "5ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GAT" "Gatifloxacin" "Table 2A" 2 8 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2021" "DISK" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "GEM" "Gemifloxacin" "Table 2A" "5ug" 20 15 FALSE +"CLSI 2021" "MIC" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "GEM" "Gemifloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Table 2A" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 4" 4 16 FALSE +"CLSI 2021" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 6" 4 16 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2021" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 11" 4 16 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "GEN" "Gentamicin" "M45 Table 20" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "GEN" "Gentamicin" "M45 Table 20" 4 16 FALSE +"CLSI 2021" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 21" 4 16 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GRX" "Grepafloxacin" "Table 2A" "5ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GRX" "Grepafloxacin" "Table 2A" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IMR" "Imipenem/relebactam" "Table 2A" "10ug/25ug" 25 20 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IMR" "Imipenem/relebactam" "Table 2A" 1 4 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IMR" "Imipenem/relebactam" "Table 2J" 4 16 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Table 2B-1" "10ug/25ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IMR" "Imipenem/relebactam" "Table 2B-1" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Table 2A" 1 4 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 3" 1 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 9" 4 16 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 4" 4 16 FALSE +"CLSI 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 21" 4 16 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 11" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 18" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "IPM" "Imipenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "IPM" "Imipenem" "M45 Table 20" 1 4 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "KAN" "Kanamycin" "Table 2A" "30ug" 18 13 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "KAN" "Kanamycin" "Table 2A" 16 64 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "LMU" "Lefamulin" "Table 2E" "20ug" 17 17 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "LMU" "Lefamulin" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LMU" "Lefamulin" "Table 2C" "20ug" 23 23 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "LMU" "Lefamulin" "Table 2C" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LMU" "Lefamulin" "Table 2C" "20ug" 23 23 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "LMU" "Lefamulin" "Table 2C" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LMU" "Lefamulin" "Table 2G" "20ug" 17 17 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LMU" "Lefamulin" "Table 2G" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "LNZ" "Linezolid" "M45 Table 2" 2 2048 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 6" 2 2048 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 11" 4 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOM" "Lomefloxacin" "Table 2A" "10ug" 22 18 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOM" "Lomefloxacin" "Table 2A" 2 8 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 TRUE +"CLSI 2021" "MIC" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 TRUE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOR" "Loracarbef" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOR" "Loracarbef" "Table 2A" 8 32 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LTM" "Latamoxef" "Table 2A" "30ug" 23 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LTM" "Latamoxef" "Table 2A" 8 64 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2021" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Table 2A" "5ug" 21 16 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Table 2A" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 4" 2 8 FALSE +"CLSI 2021" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2021" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_GEMLL" "Gemella" 3 "LVX" "Levofloxacin" "M45 Table 8" 2 8 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "LVX" "Levofloxacin" "M45 Table 12" 2 8 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 16" 2 2048 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 22 14 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 17" "5ug" 28 28 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2021" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "LVX" "Levofloxacin" "M45 Table 19" 1 4 FALSE +"CLSI 2021" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2021" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "LVX" "Levofloxacin" "M45 Table 20" "5ug" 17 13 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "LVX" "Levofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2021" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MAN" "Cefamandole" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MAN" "Cefamandole" "Table 2A" 8 32 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2021" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Table 2A" "10ug" 15 11 TRUE +"CLSI 2021" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Table 2A" 8 32 TRUE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Table 2A" 1 4 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "M45 Table 2" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 3" 1 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 9" 4 16 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "MEM" "Meropenem" "M45 Table 4" 4 16 FALSE +"CLSI 2021" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2021" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 6" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_GEMLL" "Gemella" 3 "MEM" "Meropenem" "M45 Table 8" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "MEM" "Meropenem" "M45 Table 11" 1 4 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "MEM" "Meropenem" "M45 Table 12" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "M45 Table 14" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "MEM" "Meropenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "MEM" "Meropenem" "M45 Table 20" 1 4 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Table 2A" "20ug/10ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 17" "5ug" 28 28 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "DISK" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Table 1" "10ug" 30 27 FALSE +"CLSI 2021" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Table 1" 0.064 0.25 FALSE +"CLSI 2021" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2021" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Table 1" "10ug" 16 13 FALSE +"CLSI 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2021" "DISK" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "MIF" "Micafungin" "Table 1" "10ug" 16 13 FALSE +"CLSI 2021" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "MIF" "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MNO" "Minocycline" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MNO" "Minocycline" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2021" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2021" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2021" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 13" 4 16 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2021" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2021" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NAL" "Nalidixic acid" "Table 2A" "30ug" 19 13 TRUE +"CLSI 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NAL" "Nalidixic acid" "Table 2A" 16 32 TRUE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Table 2A" "30ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Table 2A" 8 32 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Table 2A" "300ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Table 2A" 32 128 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2021" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Table 2A" "10ug" 17 12 TRUE +"CLSI 2021" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Table 2A" 4 16 TRUE +"CLSI 2021" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 TRUE +"CLSI 2021" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 TRUE +"CLSI 2021" "MIC" "UTI" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 TRUE +"CLSI 2021" "DISK" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 TRUE +"CLSI 2021" "MIC" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 TRUE +"CLSI 2021" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 TRUE +"CLSI 2021" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 TRUE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Table 2A" "5ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Table 2A" 2 8 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2021" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "OFX" "Ofloxacin" "M45 Table 20" "5ug" 16 12 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "OFX" "Ofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "ORI" "Oritavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ORI" "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ORI" "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2021" "DISK" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2021" "MIC" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2021" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2021" "DISK" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2021" "MIC" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2021" "DISK" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2021" "MIC" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" 0.5 1 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2021" "DISK" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 2" 0.125 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 4" 0.125 0.25 FALSE +"CLSI 2021" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 21" 0.5 1 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 4 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2021" "MIC" "B_GEMLL" "Gemella" 3 "PEN" "Benzylpenicillin" "M45 Table 8" 0.125 4 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2021" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2021" "MIC" "B_MCRCCC" "Micrococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 15" 0.125 0.25 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2021" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 17" "10 units" 25 25 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "PEN" "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2021" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2021" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2021" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2021" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Table 2A" "100ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Table 2A" 16 128 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "PIP" "Piperacillin" "M45 Table 20" "100ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "PIP" "Piperacillin" "M45 Table 20" 16 128 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PLB" "Polymyxin B" "Table 2A" 0.001 4 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 0.001 4 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 0.001 8 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 6" 1 4 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2021" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2021" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 4" 1 4 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 6" 1 4 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 16" 1 4 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Table 2A" "10ug/10ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Table 2A" 16 32 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 20" "10ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 20" 8 32 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SMX" "Sulfamethoxazole" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SMX" "Sulfamethoxazole" "Table 2A" 256 512 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug/300ug" 17 12 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "SMX" "Sulfamethoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SOX" "Sulfisoxazole" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SOX" "Sulfisoxazole" "Table 2A" 256 512 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug/300ug" 17 12 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "SOX" "Sulfisoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SSS" "Sulfonamide" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SSS" "Sulfonamide" "Table 2A" 256 512 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "SSS" "Sulfonamide" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "SSS" "Sulfonamide" "M45 Table 20" 256 512 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "STR" "Streptoduocin" "Table 2A" "10ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2021" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2021" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 21" 4 16 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2A" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2A" 2 4 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 4" 2 4 FALSE +"CLSI 2021" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 2048 FALSE +"CLSI 2021" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 6" 2 4 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 2 4 FALSE +"CLSI 2021" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 0.5 4 FALSE +"CLSI 2021" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2021" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 17" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE +"CLSI 2021" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 20" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 20" 2 4 FALSE +"CLSI 2021" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Table 2A" "75/10-15ug" 20 14 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Table 2A" 16 128 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2021" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2021" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCY" "Tetracycline" "Table 2A" "30ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCY" "Tetracycline" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "TCY" "Tetracycline" "M45 Table 2" 2 8 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2021" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 4" 4 16 FALSE +"CLSI 2021" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2021" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2021" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 5" "30ug" 26 22 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 5" 4 16 FALSE +"CLSI 2021" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2021" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2021" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2021" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2021" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 16" "30ug" 29 24 FALSE +"CLSI 2021" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 16" 2 8 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2021" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 17" "30ug" 23 23 FALSE +"CLSI 2021" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 17" 1 2048 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "TCY" "Tetracycline" "M45 Table 20" "30ug" 15 11 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "TCY" "Tetracycline" "M45 Table 20" 4 16 FALSE +"CLSI 2021" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "TLV" "Telavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TLV" "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TLV" "Telavancin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TLV" "Telavancin" "Table 2H-2" 0.125 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Table 2A" "5ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Table 2A" 8 16 FALSE +"CLSI 2021" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Table 2A" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Table 2A" 4 16 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2021" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2021" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "TZD" "Tedizolid" "Table 2D" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TZD" "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TZD" "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2021" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Table 2A" "100ug/10ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Table 2A" 16 128 FALSE +"CLSI 2021" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2021" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 3" 16 128 FALSE +"CLSI 2021" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 16 128 FALSE +"CLSI 2021" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2021" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2021" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2021" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2021" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2021" "DISK" "B_VIBRI" "Vibrio" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 20" "100ug/10ug" 21 17 FALSE +"CLSI 2021" "MIC" "B_VIBRI" "Vibrio" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 20" 16 128 FALSE +"CLSI 2021" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2021" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "M45 Table 2" 1 2048 FALSE +"CLSI 2021" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 4" 4 2048 FALSE +"CLSI 2021" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 6" 2 2048 FALSE +"CLSI 2021" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2021" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2021" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2021" "MIC" "B_GEMLL" "Gemella" 3 "VAN" "Vancomycin" "M45 Table 8" 1 2048 FALSE +"CLSI 2021" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2021" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 11" 2 16 FALSE +"CLSI 2021" "MIC" "B_LCTCC" "Lactococcus" 3 "VAN" "Vancomycin" "M45 Table 12" 2 4 FALSE +"CLSI 2021" "MIC" "B_MCRCCC" "Micrococcus" 3 "VAN" "Vancomycin" "M45 Table 15" 2 2048 FALSE +"CLSI 2021" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "VAN" "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2021" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2021" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2021" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2021" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2021" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2021" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2021" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2021" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2021" "MIC" "F_ASPRG_MGTS" "Aspergillus fumigatus" 2 "VOR" "Voriconazole" "M61 Table 1" 0.5 2 FALSE +"CLSI 2021" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2021" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2021" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "VOR" "Voriconazole" "Table 1" "1ug" 15 12 FALSE +"CLSI 2021" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "VOR" "Voriconazole" "Table 1" 0.5 2 FALSE +"CLSI 2021" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2021" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2021" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2021" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Table 2A" "20ug/10ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMC" "Amoxicillin/clavulanic acid" "Table 2A" 8 32 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 21" 8 32 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" "20ug/10ug" 24 23 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 4 8 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 17" "20ug/10ug" 27 27 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 20" "20ug/10ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 20" 8 32 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Table 2A" "30ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMK" "Amikacin" "Table 2A" 16 64 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 4" 16 64 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "AMK" "Amikacin" "M45 Table 20" "30ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "AMK" "Amikacin" "M45 Table 20" 16 64 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Table 2A" "10ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "AMP" "Ampicillin" "Table 2A" 8 32 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 4" 0.25 0.5 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "AMP" "Ampicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2020" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2020" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 17" "10ug" 27 27 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "AMP" "Ampicillin" "M45 Table 20" "10ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "AMP" "Ampicillin" "M45 Table 20" 8 32 FALSE +"CLSI 2020" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "AMX" "Amoxicillin" "M45 Table 21" 0.125 0.25 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2020" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "ANI" "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Table 2A" "30ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ATM" "Aztreonam" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 3" 4 16 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 16" "15ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "Table 2F" 1 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 17" "15ug" 20 20 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 17" 1 2048 FALSE +"CLSI 2020" "DISK" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2020" "MIC" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "AZM" "Azithromycin" "M45 Table 20" 2 2048 FALSE +"CLSI 2020" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "CAS" "Caspofungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2020" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2020" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "CAS" "Caspofungin" "Table 1" "5ug" 13 10 FALSE +"CLSI 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "CAS" "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "DISK" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "CAS" "Caspofungin" "Table 1" "5ug" 13 10 FALSE +"CLSI 2020" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "CAS" "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAT" "Cefetamet" "Table 2A" "10ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAT" "Cefetamet" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Table 2A" "30ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CAZ" "Ceftazidime" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 3" 4 16 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 21" 8 32 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 16" 2 2048 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "CAZ" "Ceftazidime" "M45 Table 20" "30ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "CAZ" "Ceftazidime" "M45 Table 20" 4 16 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CDR" "Cefdinir" "Table 2A" "5ug" 20 16 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CDR" "Cefdinir" "Table 2A" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CEC" "Cefaclor" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CEC" "Cefaclor" "Table 2A" 8 32 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 16" 8 32 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Table 2A" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFM" "Cefixime" "Table 2A" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFP" "Cefoperazone" "Table 2A" "75ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CFP" "Cefoperazone" "Table 2A" 16 64 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Table 2A" "30ug" 18 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CHL" "Chloramphenicol" "Table 2A" 8 32 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 4" 8 32 FALSE +"CLSI 2020" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2020" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 21" 8 2048 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2020" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 13" 8 32 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 2 8 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2020" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 18" 8 32 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 17" "30ug" 28 28 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 17" 2 2048 FALSE +"CLSI 2020" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "CHL" "Chloramphenicol" "M45 Table 20" "30ug" 18 12 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "CHL" "Chloramphenicol" "M45 Table 20" 8 32 FALSE +"CLSI 2020" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 21" 8 32 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CID" "Cefonicid" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CID" "Cefonicid" "Table 2A" 8 32 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIN" "Cinoxacin" "Table 2A" "100ug" 19 14 TRUE +"CLSI 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIN" "Cinoxacin" "Table 2A" 16 64 TRUE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 26 21 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CIP" "Ciprofloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 4" 1 4 FALSE +"CLSI 2020" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 5" "5ug" 24 20 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 5" 1 4 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2020" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 1 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 25 18 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2020" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "CIP" "Ciprofloxacin" "M45 Table 20" "5ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "CIP" "Ciprofloxacin" "M45 Table 20" 1 4 FALSE +"CLSI 2020" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 4" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 6" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_GEMLL" "Gemella" 3 "CLI" "Clindamycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 11" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_MCRCCC" "Micrococcus" 3 "CLI" "Clindamycin" "M45 Table 15" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 16" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "CLI" "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2020" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 10" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 16" "15ug" 24 24 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 16" 1 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CMZ" "Cefmetazole" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CMZ" "Cefmetazole" "Table 2A" 16 64 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "COL" "Colistin" "Table 2A" 0.001 4 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 0.001 4 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 0.001 4 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Table 2A" "10ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPD" "Cefpodoxime" "Table 2A" 2 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPR" "Cefprozil" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPR" "Cefprozil" "Table 2A" 8 32 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CPT" "Ceftaroline" "Table 2A" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2020" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2020" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CRO" "Ceftriaxone" "Table 2A" 1 4 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 3" 1 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 6" 1 4 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2020" "MIC" "B_GEMLL" "Gemella" 3 "CRO" "Ceftriaxone" "M45 Table 8" 1 4 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "CRO" "Ceftriaxone" "M45 Table 12" 1 4 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 16" 2 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 17" "30ug" 34 34 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 17" 0.125 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Table 2A" "30ug" 21 17 TRUE +"CLSI 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTB" "Ceftibuten" "Table 2A" 8 32 TRUE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTT" "Cefotetan" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTT" "Cefotetan" "Table 2A" 16 64 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Table 2A" "30ug" 26 22 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CTX" "Cefotaxime" "Table 2A" 1 4 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 3" 1 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 6" 1 4 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2020" "MIC" "B_GEMLL" "Gemella" 3 "CTX" "Cefotaxime" "M45 Table 8" 1 4 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 16" 2 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "CTX" "Cefotaxime" "M45 Table 20" "30ug" 26 22 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "CTX" "Cefotaxime" "M45 Table 20" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2020" "DISK" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" "30ug" 23 14 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" 8 32 FALSE +"CLSI 2020" "MIC" "Oral" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CXM" "Cefuroxime" "Table 2A" 4 32 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 3" 8 32 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2020" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 16" 4 16 FALSE +"CLSI 2020" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "CXM" "Cefuroxime" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "CXM" "Cefuroxime" "M45 Table 20" 8 32 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Table 2A" "30ug/20ug" 21 20 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZA" "Ceftazidime/avibactam" "Table 2A" 8 16 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" "30ug" 21 20 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE +"CLSI 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 2 8 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "CZO" "Cefazolin" "M45 Table 20" 2 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Table 2A" "30ug/10ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZT" "Ceftolozane/tazobactam" "Table 2A" 2 8 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Table 2B-1" "30ug/10ug" 21 16 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Table 2B-1" 4 16 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZT" "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZX" "Ceftizoxime" "Table 2A" "30ug" 25 21 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZX" "Ceftizoxime" "Table 2A" 1 4 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "DAL" "Dalbavancin" "Table 2D" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "DAL" "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "DAL" "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 6" 1 2048 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 2 8 FALSE +"CLSI 2020" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "DAP" "Daptomycin" "Table 2D" 0.001 8 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 11" 4 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 2 8 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOR" "Doripenem" "Table 2A" 1 4 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "DOR" "Doripenem" "M45 Table 3" "10ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "DOR" "Doripenem" "M45 Table 3" 1 4 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOX" "Doxycycline" "Table 2A" "30ug" 14 10 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "DOX" "Doxycycline" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2020" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2020" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 2 8 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 6" 4 16 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2020" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 17" "30ug" 23 23 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "DOX" "Doxycycline" "M45 Table 20" 4 16 FALSE +"CLSI 2020" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2020" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2020" "MIC" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" 0.25 2 FALSE +"CLSI 2020" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ENX" "Enoxacin" "Table 2A" "10ug" 18 14 TRUE +"CLSI 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ENX" "Enoxacin" "Table 2A" 2 8 TRUE +"CLSI 2020" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 TRUE +"CLSI 2020" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 TRUE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 4" 0.5 8 FALSE +"CLSI 2020" "DISK" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" "15ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 8 32 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 6" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2020" "MIC" "B_GEMLL" "Gemella" 3 "ERY" "Erythromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 11" 0.5 8 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "ERY" "Erythromycin" "M45 Table 12" 0.5 8 FALSE +"CLSI 2020" "MIC" "B_MCRCCC" "Micrococcus" 3 "ERY" "Erythromycin" "M45 Table 15" 0.5 8 FALSE +"CLSI 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 16" "15ug" 21 21 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 16" 2 2048 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 17" "15ug" 27 24 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 17" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "ERY" "Erythromycin" "M45 Table 19" 0.5 8 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Table 2A" "10ug" 22 18 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "ETP" "Ertapenem" "Table 2A" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 3" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Table 2A" "30ug" 16 11 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FDC" "Cefiderocol" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FDC" "Cefiderocol" "Table 2B-2" "30ug" 15 10 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FDC" "Cefiderocol" "Table 2B-2" 4 16 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Table 2B-1" "30ug" 18 12 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Table 2B-1" 4 16 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "FDC" "Cefiderocol" "Table 2B-4" "30ug" 17 12 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "FDC" "Cefiderocol" "Table 2B-4" 4 16 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Table 2A" "30ug" 25 18 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FEP" "Cefepime" "Table 2A" 2 16 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 3" 2 16 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 6" 1 4 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2020" "DISK" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2020" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "FEP" "Cefepime" "M45 Table 20" "30ug" 25 18 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "FEP" "Cefepime" "M45 Table 20" 2 16 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FLE" "Fleroxacin" "Table 2A" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FLE" "Fleroxacin" "Table 2A" 2 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2020" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Table 1" "25ug" 50 14 FALSE +"CLSI 2020" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Table 1" 0.001 64 FALSE +"CLSI 2020" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2020" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Table 2A" "200ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Table 2A" 64 256 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "FOX" "Cefoxitin" "Table 2A" 8 32 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 3" 8 32 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2020" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2020" "DISK" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2020" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2020" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "FOX" "Cefoxitin" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "FOX" "Cefoxitin" "M45 Table 20" 8 32 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GAT" "Gatifloxacin" "Table 2A" "5ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GAT" "Gatifloxacin" "Table 2A" 2 8 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2020" "DISK" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "GEM" "Gemifloxacin" "Table 2A" "5ug" 20 15 FALSE +"CLSI 2020" "MIC" "B_KLBSL_PNMN_PNMN" "Klebsiella pneumoniae pneumoniae" 1 "GEM" "Gemifloxacin" "Table 2A" 0.25 1 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Table 2A" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GEN" "Gentamicin" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 4" 4 16 FALSE +"CLSI 2020" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 6" 4 16 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2020" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 11" 4 16 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "GEN" "Gentamicin" "M45 Table 20" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "GEN" "Gentamicin" "M45 Table 20" 4 16 FALSE +"CLSI 2020" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 21" 4 16 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GRX" "Grepafloxacin" "Table 2A" "5ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "GRX" "Grepafloxacin" "Table 2A" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "IPM" "Imipenem" "Table 2A" 1 4 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 3" 1 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 9" 4 16 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 4" 4 16 FALSE +"CLSI 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 21" 4 16 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 11" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 18" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "IPM" "Imipenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "IPM" "Imipenem" "M45 Table 20" 1 4 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "KAN" "Kanamycin" "Table 2A" "30ug" 18 13 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "KAN" "Kanamycin" "Table 2A" 16 64 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "LNZ" "Linezolid" "M45 Table 2" 2 2048 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 6" 2 2048 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 11" 4 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOM" "Lomefloxacin" "Table 2A" "10ug" 22 18 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOM" "Lomefloxacin" "Table 2A" 2 8 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2020" "DISK" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 TRUE +"CLSI 2020" "MIC" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 TRUE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOR" "Loracarbef" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LOR" "Loracarbef" "Table 2A" 8 32 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LTM" "Latamoxef" "Table 2A" "30ug" 23 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LTM" "Latamoxef" "Table 2A" 8 64 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2020" "MIC" "Parenteral" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Table 2A" "5ug" 21 16 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "LVX" "Levofloxacin" "Table 2A" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 4" 2 8 FALSE +"CLSI 2020" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2020" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_GEMLL" "Gemella" 3 "LVX" "Levofloxacin" "M45 Table 8" 2 8 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "LVX" "Levofloxacin" "M45 Table 12" 2 8 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 16" 2 2048 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 22 14 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 17" "5ug" 28 28 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2020" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "LVX" "Levofloxacin" "M45 Table 19" 1 4 FALSE +"CLSI 2020" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2020" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "LVX" "Levofloxacin" "M45 Table 20" "5ug" 17 13 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "LVX" "Levofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2020" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MAN" "Cefamandole" "Table 2A" "30ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MAN" "Cefamandole" "Table 2A" 8 32 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2020" "DISK" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Table 2A" "10ug" 15 11 TRUE +"CLSI 2020" "MIC" "UTI" "B_ESCHR_COLI" "Escherichia coli" 2 "MEC" "Mecillinam" "Table 2A" 8 32 TRUE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Table 2A" "10ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEM" "Meropenem" "Table 2A" 1 4 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "M45 Table 2" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 3" 1 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 9" 4 16 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "MEM" "Meropenem" "M45 Table 4" 4 16 FALSE +"CLSI 2020" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2020" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 6" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_GEMLL" "Gemella" 3 "MEM" "Meropenem" "M45 Table 8" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "MEM" "Meropenem" "M45 Table 11" 1 4 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "MEM" "Meropenem" "M45 Table 12" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "M45 Table 14" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "MEM" "Meropenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "MEM" "Meropenem" "M45 Table 20" 1 4 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Table 2A" "20ug/10ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MEV" "Meropenem/vaborbactam" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 17" "5ug" 28 28 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "DISK" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Table 1" "10ug" 30 27 FALSE +"CLSI 2020" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Table 1" 0.064 0.25 FALSE +"CLSI 2020" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2020" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Table 1" "10ug" 16 13 FALSE +"CLSI 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2020" "DISK" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "MIF" "Micafungin" "Table 1" "10ug" 16 13 FALSE +"CLSI 2020" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "MIF" "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MNO" "Minocycline" "Table 2A" "30ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "MNO" "Minocycline" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2020" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2020" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2020" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 13" 4 16 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2020" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2020" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NAL" "Nalidixic acid" "Table 2A" "30ug" 19 13 TRUE +"CLSI 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NAL" "Nalidixic acid" "Table 2A" 16 32 TRUE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Table 2A" "30ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NET" "Netilmicin" "Table 2A" 8 32 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Table 2A" "300ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NIT" "Nitrofurantoin" "Table 2A" 32 128 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2020" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Table 2A" "10ug" 17 12 TRUE +"CLSI 2020" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "NOR" "Norfloxacin" "Table 2A" 4 16 TRUE +"CLSI 2020" "DISK" "UTI" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 TRUE +"CLSI 2020" "MIC" "UTI" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 TRUE +"CLSI 2020" "MIC" "UTI" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 TRUE +"CLSI 2020" "DISK" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 TRUE +"CLSI 2020" "MIC" "UTI" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 TRUE +"CLSI 2020" "DISK" "UTI" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 TRUE +"CLSI 2020" "MIC" "UTI" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 TRUE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Table 2A" "5ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "OFX" "Ofloxacin" "Table 2A" 2 8 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2020" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "OFX" "Ofloxacin" "M45 Table 20" "5ug" 16 12 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "OFX" "Ofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "ORI" "Oritavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ORI" "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ORI" "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2020" "DISK" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2020" "MIC" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2020" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2020" "DISK" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2020" "MIC" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2020" "DISK" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2020" "MIC" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2020" "DISK" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 2" 0.125 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 4" 0.125 0.25 FALSE +"CLSI 2020" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 21" 0.5 1 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 4 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2020" "MIC" "B_GEMLL" "Gemella" 3 "PEN" "Benzylpenicillin" "M45 Table 8" 0.125 4 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2020" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2020" "MIC" "B_MCRCCC" "Micrococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 15" 0.125 0.25 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2020" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 17" "10 units" 25 25 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "PEN" "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2020" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2020" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2020" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2020" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Table 2A" "100ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PIP" "Piperacillin" "Table 2A" 16 128 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PIP" "Piperacillin" "Table 2J" 32 128 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "PIP" "Piperacillin" "M45 Table 20" "100ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "PIP" "Piperacillin" "M45 Table 20" 16 128 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "PLB" "Polymyxin B" "Table 2A" 0.001 4 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 0.001 4 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 0.001 8 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 6" 1 4 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2020" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2020" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2C" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 4" 1 4 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 6" 1 4 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 16" 1 4 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Table 2A" "10ug/10ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SAM" "Ampicillin/sulbactam" "Table 2A" 16 32 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 20" "10ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 20" 8 32 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SMX" "Sulfamethoxazole" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SMX" "Sulfamethoxazole" "Table 2A" 256 512 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "SMX" "Sulfamethoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SOX" "Sulfisoxazole" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SOX" "Sulfisoxazole" "Table 2A" 256 512 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "SOX" "Sulfisoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2020" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "SPT" "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2020" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SSS" "Sulfonamide" "Table 2A" "200ug/300ug" 17 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SSS" "Sulfonamide" "Table 2A" 256 512 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "SSS" "Sulfonamide" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "SSS" "Sulfonamide" "M45 Table 20" 256 512 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "STR" "Streptoduocin" "Table 2A" "10ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2020" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2020" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 21" 4 16 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2A" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2A" 2 4 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 4" 2 4 FALSE +"CLSI 2020" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 2048 FALSE +"CLSI 2020" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 6" 2 4 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 2 4 FALSE +"CLSI 2020" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 0.5 4 FALSE +"CLSI 2020" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2020" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 17" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE +"CLSI 2020" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 20" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 20" 2 4 FALSE +"CLSI 2020" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Table 2A" "75/10-15ug" 20 14 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCC" "Ticarcillin/clavulanic acid" "Table 2A" 16 128 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2020" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2020" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCY" "Tetracycline" "Table 2A" "30ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TCY" "Tetracycline" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "TCY" "Tetracycline" "M45 Table 2" 2 8 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2020" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 4" 4 16 FALSE +"CLSI 2020" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2020" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2020" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 5" "30ug" 26 22 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 5" 4 16 FALSE +"CLSI 2020" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2020" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2020" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2020" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2020" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 16" "30ug" 29 24 FALSE +"CLSI 2020" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 16" 2 8 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2020" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 17" "30ug" 23 23 FALSE +"CLSI 2020" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 17" 1 2048 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "TCY" "Tetracycline" "M45 Table 20" "30ug" 15 11 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "TCY" "Tetracycline" "M45 Table 20" 4 16 FALSE +"CLSI 2020" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2020" "DISK" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2020" "MIC" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2020" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2020" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "TLV" "Telavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TLV" "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TLV" "Telavancin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TLV" "Telavancin" "Table 2H-2" 0.125 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Table 2A" "5ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TMP" "Trimethoprim" "Table 2A" 8 16 FALSE +"CLSI 2020" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Table 2A" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TOB" "Tobramycin" "Table 2A" 4 16 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2020" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2020" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "TZD" "Tedizolid" "Table 2D" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TZD" "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TZD" "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2020" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Table 2A" "100ug/10ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "TZP" "Piperacillin/tazobactam" "Table 2A" 16 128 FALSE +"CLSI 2020" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2020" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 3" 16 128 FALSE +"CLSI 2020" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 16 128 FALSE +"CLSI 2020" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2020" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2020" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2020" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2020" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2020" "DISK" "B_VIBRI" "Vibrio" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 20" "100ug/10ug" 21 17 FALSE +"CLSI 2020" "MIC" "B_VIBRI" "Vibrio" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 20" 16 128 FALSE +"CLSI 2020" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2020" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "M45 Table 2" 1 2048 FALSE +"CLSI 2020" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 4" 4 2048 FALSE +"CLSI 2020" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 6" 2 2048 FALSE +"CLSI 2020" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2020" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2020" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2020" "MIC" "B_GEMLL" "Gemella" 3 "VAN" "Vancomycin" "M45 Table 8" 1 2048 FALSE +"CLSI 2020" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2020" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 11" 2 16 FALSE +"CLSI 2020" "MIC" "B_LCTCC" "Lactococcus" 3 "VAN" "Vancomycin" "M45 Table 12" 2 4 FALSE +"CLSI 2020" "MIC" "B_MCRCCC" "Micrococcus" 3 "VAN" "Vancomycin" "M45 Table 15" 2 2048 FALSE +"CLSI 2020" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "VAN" "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2020" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2020" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2020" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2020" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2020" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2020" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2020" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2020" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2020" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2020" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2020" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "VOR" "Voriconazole" "Table 1" "1ug" 15 12 FALSE +"CLSI 2020" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "VOR" "Voriconazole" "Table 1" 0.5 2 FALSE +"CLSI 2020" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2020" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2020" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2020" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2019" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 21" 8 32 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 9" 4 8 FALSE +"CLSI 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" "20ug/10ug" 24 23 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 4 8 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 17" "20ug/10ug" 27 27 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 20" "20ug/10ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 20" 8 32 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 4" 16 64 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "AMK" "Amikacin" "M45 Table 20" "30ug" 17 14 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "AMK" "Amikacin" "M45 Table 20" 16 64 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 4" 0.25 0.5 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "AMP" "Ampicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "AMP" "Ampicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2019" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 17" "10ug" 27 27 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "AMP" "Ampicillin" "M45 Table 20" "10ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "AMP" "Ampicillin" "M45 Table 20" 8 32 FALSE +"CLSI 2019" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "AMX" "Amoxicillin" "M45 Table 21" 0.125 0.25 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "ANI" "Anidulafungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2019" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "ANI" "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "ANI" "Anidulafungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "ANI" "Anidulafungin" "Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 3" 4 16 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 16" "15ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "AZM" "Azithromycin" "Table 2F" 1 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 17" "15ug" 20 20 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 17" 1 2048 FALSE +"CLSI 2019" "DISK" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2019" "MIC" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "AZM" "Azithromycin" "M45 Table 20" 2 2048 FALSE +"CLSI 2019" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "CAS" "Caspofungin" "Table 1" 0.125 0.5 FALSE +"CLSI 2019" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2019" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "CAS" "Caspofungin" "Table 1" "5ug" 13 10 FALSE +"CLSI 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "CAS" "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "CAS" "Caspofungin" "Table 1" "5ug" 17 14 FALSE +"CLSI 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "CAS" "Caspofungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "DISK" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "CAS" "Caspofungin" "Table 1" "5ug" 13 10 FALSE +"CLSI 2019" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "CAS" "Caspofungin" "Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 3" 4 16 FALSE +"CLSI 2019" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2019" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 21" 8 32 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 16" 2 2048 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2019" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "CAZ" "Ceftazidime" "M45 Table 20" "30ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "CAZ" "Ceftazidime" "M45 Table 20" 4 16 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 16" 8 32 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 4" 8 32 FALSE +"CLSI 2019" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2019" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 21" 8 2048 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 9" 4 16 FALSE +"CLSI 2019" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 13" 8 32 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 2 8 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2019" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 18" 8 32 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 17" "30ug" 28 28 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 17" 2 2048 FALSE +"CLSI 2019" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "CHL" "Chloramphenicol" "M45 Table 20" "30ug" 18 12 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "CHL" "Chloramphenicol" "M45 Table 20" 8 32 FALSE +"CLSI 2019" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 21" 8 32 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 4" 1 4 FALSE +"CLSI 2019" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2019" "DISK" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 5" "5ug" 24 20 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 5" 1 4 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2019" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 1 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 25 18 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 0.5 2 FALSE +"CLSI 2019" "DISK" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2019" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2019" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2019" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "CIP" "Ciprofloxacin" "M45 Table 20" "5ug" 21 15 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "CIP" "Ciprofloxacin" "M45 Table 20" 1 4 FALSE +"CLSI 2019" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 4" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 6" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_GEMLL" "Gemella" 3 "CLI" "Clindamycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 11" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_MCRCCC" "Micrococcus" 3 "CLI" "Clindamycin" "M45 Table 15" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 16" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "CLI" "Clindamycin" "M45 Table 19" 0.5 4 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2019" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 10" 0.25 1 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 9" 8 32 FALSE +"CLSI 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 16" "15ug" 24 24 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 16" 1 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 2 4 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "COL" "Colistin" "Table 2B-5" 2 8 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 2 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2019" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2019" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 25 19 FALSE +"CLSI 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "CPT" "Ceftaroline" "Table 2C" 1 8 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRB" "Carbenicillin" "Table 2B-5" 16 64 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 3" 1 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 6" 1 4 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2019" "MIC" "B_GEMLL" "Gemella" 3 "CRO" "Ceftriaxone" "M45 Table 8" 1 4 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 9" 2 2048 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "CRO" "Ceftriaxone" "M45 Table 12" 1 4 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 16" 2 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 17" "30ug" 34 34 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 17" 0.125 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 3" 1 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 6" 1 4 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2019" "MIC" "B_GEMLL" "Gemella" 3 "CTX" "Cefotaxime" "M45 Table 8" 1 4 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 9" 2 2048 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 16" 2 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "CTX" "Cefotaxime" "M45 Table 20" "30ug" 26 22 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "CTX" "Cefotaxime" "M45 Table 20" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 3" 8 32 FALSE +"CLSI 2019" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2019" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2019" "MIC" "Oral" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 16" 4 16 FALSE +"CLSI 2019" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2019" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "CXM" "Cefuroxime" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "CXM" "Cefuroxime" "M45 Table 20" 8 32 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" "30ug" 21 20 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE +"CLSI 2019" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2019" "DISK" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 23 19 FALSE +"CLSI 2019" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2019" "MIC" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 2 8 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "CZO" "Cefazolin" "M45 Table 20" 2 8 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Table 2B-1" "30ug/10ug" 21 16 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "Table 2B-1" 4 16 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZT" "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "DAL" "Dalbavancin" "Table 2D" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "DAL" "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "DAL" "Dalbavancin" "Table 2C" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 6" 1 2048 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 2 8 FALSE +"CLSI 2019" "MIC" "B_ENTRC_FACM" "Enterococcus faecium" 2 "DAP" "Daptomycin" "Table 2D" 4 8 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 11" 4 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 2 8 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "DOR" "Doripenem" "M45 Table 3" "10ug" 23 19 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "DOR" "Doripenem" "M45 Table 3" 1 4 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2019" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2019" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2019" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 2 8 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 6" 4 16 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2019" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 17" "30ug" 23 23 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "DOX" "Doxycycline" "M45 Table 20" 4 16 FALSE +"CLSI 2019" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 21" 4 16 FALSE +"CLSI 2019" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2019" "MIC" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" 0.25 2 FALSE +"CLSI 2019" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 4" 0.5 8 FALSE +"CLSI 2019" "DISK" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" "15ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 8 32 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 6" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2019" "MIC" "B_GEMLL" "Gemella" 3 "ERY" "Erythromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 11" 0.5 8 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "ERY" "Erythromycin" "M45 Table 12" 0.5 8 FALSE +"CLSI 2019" "MIC" "B_MCRCCC" "Micrococcus" 3 "ERY" "Erythromycin" "M45 Table 15" 0.5 8 FALSE +"CLSI 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 16" "15ug" 21 21 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 16" 2 2048 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 17" "15ug" 27 24 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 17" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "ERY" "Erythromycin" "M45 Table 19" 0.5 8 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 3" "10ug" 22 18 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 3" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "FDC" "Cefiderocol" "Table 2B-2" 4 16 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FDC" "Cefiderocol" "Table 2B-1" 4 16 FALSE +"CLSI 2019" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "FDC" "Cefiderocol" "Table 2B-4" 4 16 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 3" "30ug" 25 18 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 3" 2 16 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 6" 1 4 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2019" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "FEP" "Cefepime" "M45 Table 20" "30ug" 25 18 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "FEP" "Cefepime" "M45 Table 20" 2 16 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2019" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Table 1" "25ug" 50 14 FALSE +"CLSI 2019" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "FLU" "Fluconazole" "Table 1" 0.001 64 FALSE +"CLSI 2019" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Table 1" "25ug" 17 13 FALSE +"CLSI 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "FLU" "Fluconazole" "Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2019" "DISK" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Table 2A" "200ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_ESCHR_COLI" "Escherichia coli" 2 "FOS" "Fosfomycin" "Table 2A" 64 256 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 3" 8 32 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2019" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2019" "DISK" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2019" "DISK" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2019" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2019" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "FOX" "Cefoxitin" "M45 Table 20" "30ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "FOX" "Cefoxitin" "M45 Table 20" 8 32 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 4" 4 16 FALSE +"CLSI 2019" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 6" 4 16 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2019" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 21" 4 2048 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 11" 4 16 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "GEN" "Gentamicin" "M45 Table 20" "10ug" 15 12 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "GEN" "Gentamicin" "M45 Table 20" 4 16 FALSE +"CLSI 2019" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 21" 4 16 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 3" "10ug" 23 19 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 3" 1 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 9" 4 16 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 4" 4 16 FALSE +"CLSI 2019" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 21" 4 16 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 11" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 18" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "IPM" "Imipenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "IPM" "Imipenem" "M45 Table 20" 1 4 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "LNZ" "Linezolid" "M45 Table 2" 2 2048 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 6" 2 2048 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 11" 4 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 4" 2 8 FALSE +"CLSI 2019" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2019" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 21" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_GEMLL" "Gemella" 3 "LVX" "Levofloxacin" "M45 Table 8" 2 8 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 9" 2 8 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "LVX" "Levofloxacin" "M45 Table 12" 2 8 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 16" 2 2048 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 22 14 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 17" "5ug" 28 28 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2019" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "LVX" "Levofloxacin" "M45 Table 19" 1 4 FALSE +"CLSI 2019" "MIC" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2019" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2019" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "LVX" "Levofloxacin" "M45 Table 20" "5ug" 17 13 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "LVX" "Levofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2019" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 21" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "MEM" "Meropenem" "M45 Table 2" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 3" "10ug" 23 19 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 3" 1 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 9" 4 16 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "MEM" "Meropenem" "M45 Table 4" 4 16 FALSE +"CLSI 2019" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2019" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 6" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_GEMLL" "Gemella" 3 "MEM" "Meropenem" "M45 Table 8" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "MEM" "Meropenem" "M45 Table 11" 1 4 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "MEM" "Meropenem" "M45 Table 12" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "MEM" "Meropenem" "M45 Table 14" 0.25 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "MEM" "Meropenem" "M45 Table 20" "10ug" 23 19 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "MEM" "Meropenem" "M45 Table 20" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 17" "5ug" 28 28 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 17" 0.064 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "DISK" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Table 1" "10ug" 30 27 FALSE +"CLSI 2019" "MIC" "F_CANDD_GLBR" "Candida glabrata" 2 "MIF" "Micafungin" "Table 1" 0.064 0.25 FALSE +"CLSI 2019" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2019" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Table 1" "10ug" 16 13 FALSE +"CLSI 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "MIF" "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "MIF" "Micafungin" "Table 1" "10ug" 22 19 FALSE +"CLSI 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "MIF" "Micafungin" "Table 1" 0.25 1 FALSE +"CLSI 2019" "DISK" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "MIF" "Micafungin" "Table 1" "10ug" 16 13 FALSE +"CLSI 2019" "MIC" "F_MYRZY_GLLR" "Meyerozyma guilliermondii" 2 "MIF" "Micafungin" "Table 1" 2 8 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2019" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2019" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2019" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 13" 4 16 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2019" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2019" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2019" "MIC" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2019" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "OFX" "Ofloxacin" "M45 Table 20" "5ug" 16 12 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "OFX" "Ofloxacin" "M45 Table 20" 2 8 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "ORI" "Oritavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "ORI" "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "ORI" "Oritavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2019" "DISK" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2019" "MIC" "B_STPHY_EPDR" "Staphylococcus epidermidis" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2019" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2019" "DISK" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2019" "MIC" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2019" "DISK" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2019" "MIC" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2019" "DISK" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 2" 0.125 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 4" 0.125 0.25 FALSE +"CLSI 2019" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 21" 0.5 1 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 4 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2019" "MIC" "B_GEMLL" "Gemella" 3 "PEN" "Benzylpenicillin" "M45 Table 8" 0.125 4 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 8 2048 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 11" 8 2048 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 12" 1 4 FALSE +"CLSI 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 14" 2 2048 FALSE +"CLSI 2019" "MIC" "B_MCRCCC" "Micrococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 15" 0.125 0.25 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2019" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 18" 8 2048 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 17" "10 units" 25 25 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "PEN" "Benzylpenicillin" "M45 Table 19" 0.125 4 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2019" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2019" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2019" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2019" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PIP" "Piperacillin" "Table 2J" 32 128 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "PIP" "Piperacillin" "M45 Table 20" "100ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "PIP" "Piperacillin" "M45 Table 20" 16 128 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 2 4 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 2 8 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 6" 1 4 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 4" 1 4 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 6" 1 4 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 9" 1 4 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 16" 1 4 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 9" 2 4 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 20" "10ug" 15 11 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 20" 8 32 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "SMX" "Sulfamethoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "SOX" "Sulfisoxazole" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2019" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "SPT" "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2019" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "SSS" "Sulfonamide" "M45 Table 20" "200ug" 17 12 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "SSS" "Sulfonamide" "M45 Table 20" 256 512 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2019" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2019" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 21" 8 2048 FALSE +"CLSI 2019" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 21" 4 16 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 4" 2 4 FALSE +"CLSI 2019" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 2048 FALSE +"CLSI 2019" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2019" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2019" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 6" 2 4 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 9" 0.5 4 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 2 4 FALSE +"CLSI 2019" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 0.5 4 FALSE +"CLSI 2019" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2019" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 17" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 17" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 19" 2 4 FALSE +"CLSI 2019" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2019" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 20" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 20" 2 4 FALSE +"CLSI 2019" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 21" 2 4 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2019" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2019" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "TCY" "Tetracycline" "M45 Table 2" 2 8 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2019" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 4" 4 16 FALSE +"CLSI 2019" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 21" 1 2048 FALSE +"CLSI 2019" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2019" "DISK" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 5" "30ug" 26 22 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 5" 4 16 FALSE +"CLSI 2019" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2019" "MIC" "B_EKNLL_CRRD" "Eikenella corrodens" 2 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2019" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 21" 4 2048 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2019" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 9" 2 8 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2019" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 16" "30ug" 29 24 FALSE +"CLSI 2019" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 16" 2 8 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2019" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 17" "30ug" 23 23 FALSE +"CLSI 2019" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 17" 1 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "TCY" "Tetracycline" "M45 Table 20" "30ug" 15 11 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "TCY" "Tetracycline" "M45 Table 20" 4 16 FALSE +"CLSI 2019" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 21" 4 16 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2019" "DISK" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2019" "MIC" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2019" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2019" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "TLV" "Telavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TLV" "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TLV" "Telavancin" "Table 2C" 0.125 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TLV" "Telavancin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TLV" "Telavancin" "Table 2H-2" 0.125 2048 FALSE +"CLSI 2019" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2019" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2019" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "TZD" "Tedizolid" "Table 2D" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "TZD" "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "TZD" "Tedizolid" "Table 2C" 0.5 2 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2019" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2019" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 3" 16 128 FALSE +"CLSI 2019" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 16 128 FALSE +"CLSI 2019" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2019" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2019" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2019" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2019" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2019" "DISK" "B_VIBRI" "Vibrio" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 20" "100ug/10ug" 21 17 FALSE +"CLSI 2019" "MIC" "B_VIBRI" "Vibrio" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 20" 16 128 FALSE +"CLSI 2019" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2019" "MIC" "B_AERCC" "Aerococcus" 3 "VAN" "Vancomycin" "M45 Table 2" 1 2048 FALSE +"CLSI 2019" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 4" 4 2048 FALSE +"CLSI 2019" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 6" 2 2048 FALSE +"CLSI 2019" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2019" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2019" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2019" "MIC" "B_GEMLL" "Gemella" 3 "VAN" "Vancomycin" "M45 Table 8" 1 2048 FALSE +"CLSI 2019" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2019" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 11" 2 16 FALSE +"CLSI 2019" "MIC" "B_LCTCC" "Lactococcus" 3 "VAN" "Vancomycin" "M45 Table 12" 2 4 FALSE +"CLSI 2019" "MIC" "B_MCRCCC" "Micrococcus" 3 "VAN" "Vancomycin" "M45 Table 15" 2 2048 FALSE +"CLSI 2019" "MIC" "B_ROTHI_MCLG" "Rothia mucilaginosa" 2 "VAN" "Vancomycin" "M45 Table 19" 2 2048 FALSE +"CLSI 2019" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2019" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2019" "MIC" "B_STPHY_COPS" "Coagulase-positive Staphylococcus (CoPS)" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2019" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2019" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2019" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2019" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2019" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2019" "DISK" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2019" "MIC" "F_CANDD_ALBC" "Candida albicans" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2019" "DISK" "F_CANDD_KRUS" "Candida krusei" 2 "VOR" "Voriconazole" "Table 1" "1ug" 15 12 FALSE +"CLSI 2019" "MIC" "F_CANDD_KRUS" "Candida krusei" 2 "VOR" "Voriconazole" "Table 1" 0.5 2 FALSE +"CLSI 2019" "DISK" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2019" "MIC" "F_CANDD_PRPS" "Candida parapsilosis" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2019" "DISK" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Table 1" "1ug" 17 14 FALSE +"CLSI 2019" "MIC" "F_CANDD_TRPC" "Candida tropicalis" 2 "VOR" "Voriconazole" "Table 1" 0.125 1 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2018" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 8 32 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" "20ug/10ug" 24 23 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" 4 8 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug/10ug" 27 27 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "AMP" "Ampicillin" "M45 Table 6" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2018" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2018" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2018" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" "10ug" 27 27 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" "15ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" 0.25 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" "15ug" 20 20 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" 1 2048 FALSE +"CLSI 2018" "DISK" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2018" "MIC" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "AZM" "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "CAZ" "Ceftazidime" "M45 Table 3" 8 32 FALSE +"CLSI 2018" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2018" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 16" 8 32 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 12" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2018" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 12" 8 32 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2018" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2018" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2018" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 10" 8 32 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 12" 2 8 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2018" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 14" 8 32 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" "30ug" 28 28 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" 2 2048 FALSE +"CLSI 2018" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2018" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 8 32 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2018" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CIP" "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2018" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 12" 1 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2018" "DISK" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2018" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2018" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2018" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 3" 0.5 4 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 5" 0.5 4 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CLI" "Clindamycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 9" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2018" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" "15ug" 24 24 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" 1 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" 2 8 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 2 4 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "COL" "Colistin" "Table 2B-5" 2 8 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 2 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2018" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRB" "Carbenicillin" "Table 2B-5" 16 64 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "CRO" "Ceftriaxone" "M45 Table 3" 8 64 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 5" 1 4 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CRO" "Ceftriaxone" "M45 Table 6" 1 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 12" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" "30ug" 34 34 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" 0.125 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2018" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "CTX" "Cefotaxime" "M45 Table 3" 8 64 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 5" 1 4 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CTX" "Cefotaxime" "M45 Table 6" 1 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 12" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2018" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2018" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 12" 4 16 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" "30ug" 31 25 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" 1 4 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2018" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" "30ug" 21 20 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZA" "Ceftazidime/avibactam" "Table 2B-1" 8 16 FALSE +"CLSI 2018" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2018" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "CZO" "Cefazolin" "M45 Table 3" 8 16 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "30ug/10ug" 21 16 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" 4 16 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZT" "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_ENTRC_FCLS" "Enterococcus faecalis" 2 "DAL" "Dalbavancin" "Table 2D" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "DAL" "Dalbavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAL" "Dalbavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 5" 1 2048 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 4 2048 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 2 8 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2018" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2018" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2018" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 3" 2 8 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 4 16 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2018" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2018" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "DOX" "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE +"CLSI 2018" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2018" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2018" "MIC" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" 0.25 2 FALSE +"CLSI 2018" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" "10ug" 36 31 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 3" 0.5 8 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 3" 8 32 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "ERY" "Erythromycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 9" 0.5 8 FALSE +"CLSI 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" "15ug" 21 21 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" 2 2048 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" "15ug" 27 24 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2018" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 5" 1 4 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "FEP" "Cefepime" "M45 Table 6" 1 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2018" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" 0.25 1 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2018" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2018" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2018" "MIC" "B_ABTRP" "Abiotrophia" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "GAT" "Gatifloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2018" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 5" 4 16 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2018" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2018" "MIC" "B_LCNST" "Leuconostoc" 3 "GEN" "Gentamicin" "M45 Table 10" 4 16 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 9" 4 16 FALSE +"CLSI 2018" "MIC" "B_PDCCC" "Pediococcus" 3 "GEN" "Gentamicin" "M45 Table 14" 4 16 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2018" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 16" 4 16 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 7" 4 16 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 3" 4 16 FALSE +"CLSI 2018" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 16" 4 16 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "IPM" "Imipenem" "M45 Table 5" 4 16 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "IPM" "Imipenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 5" 2 2048 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 9" 4 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" "10ug" 38 26 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" 0.125 2 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2018" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 8 FALSE +"CLSI 2018" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "LVX" "Levofloxacin" "M45 Table 6" 2 2048 FALSE +"CLSI 2018" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 12" 2 2048 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2018" "MIC" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2018" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2018" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2018" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2018" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 7" 4 16 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2018" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2018" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 5" 4 16 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "MEM" "Meropenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2018" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2018" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2018" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 10" 4 16 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2018" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2018" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" "5ug" 31 24 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" 0.25 2 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2018" "MIC" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2018" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "ORI" "Oritavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2018" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2018" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2018" "DISK" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2018" "MIC" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2018" "DISK" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2018" "MIC" "B_STPHY_SCHL" "Staphylococcus schleiferi" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 0.25 0.5 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2018" "DISK" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2018" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE +"CLSI 2018" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 16" 0.125 0.25 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 5" 1 4 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2018" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 2048 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2018" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2018" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" "10 units" 25 25 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2018" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2018" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2018" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2018" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PIP" "Piperacillin" "Table 2J" 32 128 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 2 4 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 2 8 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 5" 1 4 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 3" 1 4 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 5" 1 4 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 12" 1 4 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2018" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "SPT" "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2018" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2018" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2018" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2018" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 16" 4 16 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2018" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 2048 FALSE +"CLSI 2018" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2018" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2018" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 5" 2 4 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2018" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 11" 0.5 4 FALSE +"CLSI 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 0.5 4 FALSE +"CLSI 2018" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2018" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2018" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2018" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2018" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2018" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2018" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2018" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2018" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2018" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2018" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2018" "MIC" "B_EKNLL" "Eikenella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2018" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2018" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2018" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" "30ug" 29 24 FALSE +"CLSI 2018" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2018" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" 1 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2018" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2018" "DISK" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2018" "MIC" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2018" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2018" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" "15ug" 15 11 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" 4 16 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "TLV" "Telavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TLV" "Telavancin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TLV" "Telavancin" "Table 2H-2" 0.125 2048 FALSE +"CLSI 2018" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2018" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2018" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "TZD" "Tedizolid" "Table 2D" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2018" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2018" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2018" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 16 128 FALSE +"CLSI 2018" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2018" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2018" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2018" "DISK" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2018" "MIC" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2018" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2018" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2018" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2018" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 3" 4 2048 FALSE +"CLSI 2018" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 5" 2 2048 FALSE +"CLSI 2018" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2018" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2018" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2018" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2018" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 9" 2 16 FALSE +"CLSI 2018" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2018" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2018" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2018" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2018" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2018" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2018" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2017" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 8 32 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" "20ug/10ug" 24 23 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" 4 8 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug/10ug" 27 27 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "AMP" "Ampicillin" "M45 Table 6" 0.25 2048 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2017" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2017" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2017" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" "10ug" 27 27 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" "15ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" 0.25 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" "15ug" 20 20 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" 1 2048 FALSE +"CLSI 2017" "DISK" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2017" "MIC" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "AZM" "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "CAZ" "Ceftazidime" "M45 Table 3" 8 32 FALSE +"CLSI 2017" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2017" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 16" 8 32 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 12" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2017" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 12" 8 32 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2017" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2017" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2017" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 10" 8 32 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 12" 2 8 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2017" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 14" 8 32 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" "30ug" 28 28 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" 2 2048 FALSE +"CLSI 2017" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2017" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 8 32 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2017" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CIP" "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2017" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 12" 1 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2017" "DISK" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2017" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2017" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2017" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 3" 0.5 4 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 5" 0.5 4 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CLI" "Clindamycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 9" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2017" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" "15ug" 24 24 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" 1 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" 2 8 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 2 4 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "COL" "Colistin" "Table 2B-5" 2 8 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 2 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2017" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRB" "Carbenicillin" "Table 2B-5" 16 64 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "CRO" "Ceftriaxone" "M45 Table 3" 8 64 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 5" 1 4 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CRO" "Ceftriaxone" "M45 Table 6" 1 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 12" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" "30ug" 34 34 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" 0.125 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2017" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "CTX" "Cefotaxime" "M45 Table 3" 8 64 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 5" 1 4 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CTX" "Cefotaxime" "M45 Table 6" 1 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 12" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2017" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2017" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 12" 4 16 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" "30ug" 31 25 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" 1 4 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2017" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2017" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "CZO" "Cefazolin" "M45 Table 3" 8 16 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "30ug/10ug" 21 16 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" 4 16 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZT" "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 5" 1 2048 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 4 2048 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 2 8 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2017" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2017" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2017" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 3" 2 8 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 4 16 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2017" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2017" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "DOX" "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE +"CLSI 2017" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2017" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2017" "MIC" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" 0.25 2 FALSE +"CLSI 2017" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" "10ug" 36 31 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 3" 0.5 8 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 3" 8 32 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "ERY" "Erythromycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 9" 0.5 8 FALSE +"CLSI 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" "15ug" 21 21 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" 2 2048 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" "15ug" 27 24 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2017" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 5" 1 4 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "FEP" "Cefepime" "M45 Table 6" 1 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2017" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" 0.25 1 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2017" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2017" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2017" "MIC" "B_ABTRP" "Abiotrophia" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "GAT" "Gatifloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2017" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 5" 4 16 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2017" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2017" "MIC" "B_LCNST" "Leuconostoc" 3 "GEN" "Gentamicin" "M45 Table 10" 4 16 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 9" 4 16 FALSE +"CLSI 2017" "MIC" "B_PDCCC" "Pediococcus" 3 "GEN" "Gentamicin" "M45 Table 14" 4 16 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2017" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 16" 4 16 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 7" 4 16 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 3" 4 16 FALSE +"CLSI 2017" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 16" 4 16 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "IPM" "Imipenem" "M45 Table 5" 4 16 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "IPM" "Imipenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 5" 2 2048 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 9" 4 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" "10ug" 38 26 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" 0.125 2 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2017" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 8 FALSE +"CLSI 2017" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2017" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "LVX" "Levofloxacin" "M45 Table 6" 2 2048 FALSE +"CLSI 2017" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 12" 2 2048 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2017" "MIC" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2017" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2017" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2017" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2017" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 7" 4 16 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2017" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2017" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 5" 4 16 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "MEM" "Meropenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2017" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2017" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2017" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 10" 4 16 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2017" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2017" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" "5ug" 31 24 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" 0.25 2 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2017" "MIC" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2017" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "ORI" "Oritavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2017" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2017" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2017" "DISK" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2017" "MIC" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2017" "DISK" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2017" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE +"CLSI 2017" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 16" 0.125 0.25 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 5" 1 4 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2017" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 2048 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2017" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2017" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" "10 units" 25 25 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2017" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2017" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2017" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2017" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PIP" "Piperacillin" "Table 2J" 32 128 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 2 4 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 2 8 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 5" 1 4 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 3" 1 4 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 5" 1 4 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 12" 1 4 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2017" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "SPT" "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2017" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2017" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2017" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2017" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 16" 4 16 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2017" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 2048 FALSE +"CLSI 2017" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2017" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2017" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 5" 2 4 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2017" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 11" 0.5 4 FALSE +"CLSI 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 0.5 4 FALSE +"CLSI 2017" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2017" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2017" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2017" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2017" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2017" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2017" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2017" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2017" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2017" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2017" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2017" "MIC" "B_EKNLL" "Eikenella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2017" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2017" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2017" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" "30ug" 29 24 FALSE +"CLSI 2017" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2017" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" 1 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2017" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2017" "DISK" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2017" "MIC" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2017" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2017" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" "15ug" 15 11 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" 4 16 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "TLV" "Telavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TLV" "Telavancin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TLV" "Telavancin" "Table 2H-2" 0.125 2048 FALSE +"CLSI 2017" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2017" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2017" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "TZD" "Tedizolid" "Table 2D" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2017" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2017" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2017" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 32 128 FALSE +"CLSI 2017" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2017" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2017" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2017" "DISK" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2017" "MIC" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2017" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2017" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2017" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2017" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 3" 4 2048 FALSE +"CLSI 2017" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 5" 2 2048 FALSE +"CLSI 2017" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2017" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2017" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2017" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2017" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 9" 2 16 FALSE +"CLSI 2017" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2017" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2017" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2017" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2017" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2017" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2017" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2016" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 8 32 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" "20ug/10ug" 24 23 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" 4 8 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug/10ug" 27 27 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "AMP" "Ampicillin" "M45 Table 6" 0.25 2048 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2016" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2016" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2016" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" "10ug" 27 27 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" "15ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" 0.25 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" "15ug" 20 20 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" 1 2048 FALSE +"CLSI 2016" "DISK" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2016" "MIC" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "AZM" "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "CAZ" "Ceftazidime" "M45 Table 3" 8 32 FALSE +"CLSI 2016" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2016" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 16" 8 32 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 12" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2016" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 12" 8 32 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2016" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2016" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2016" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 10" 8 32 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 12" 2 8 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2016" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 14" 8 32 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" "30ug" 28 28 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" 2 2048 FALSE +"CLSI 2016" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2016" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 8 32 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2016" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CIP" "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2016" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 12" 1 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2016" "DISK" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2016" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2016" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2016" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 3" 0.5 4 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 5" 0.5 4 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CLI" "Clindamycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 9" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2016" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" "15ug" 24 24 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" 1 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" 2 8 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 2 4 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "COL" "Colistin" "Table 2B-5" 2 8 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" "10ug" 11 10 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2016" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRB" "Carbenicillin" "Table 2B-5" 16 64 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "CRO" "Ceftriaxone" "M45 Table 3" 8 64 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 5" 1 4 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CRO" "Ceftriaxone" "M45 Table 6" 1 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 12" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" "30ug" 34 34 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" 0.125 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2016" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "CTX" "Cefotaxime" "M45 Table 3" 8 64 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 5" 1 4 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CTX" "Cefotaxime" "M45 Table 6" 1 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 12" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2016" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2016" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 12" 4 16 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" "30ug" 31 25 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" 1 4 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2016" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2016" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "CZO" "Cefazolin" "M45 Table 3" 8 16 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" "30ug/10ug" 21 16 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CZT" "Ceftolozane/tazobactam" 4 16 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CZT" "Ceftolozane/tazobactam" "Table 2H-2" 8 32 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 5" 1 2048 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 4 2048 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 2 8 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2016" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2016" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2016" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 3" 2 8 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 4 16 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2016" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2016" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "DOX" "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE +"CLSI 2016" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2016" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2016" "MIC" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" 0.25 2 FALSE +"CLSI 2016" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" "10ug" 36 31 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 3" 0.5 8 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 3" 8 32 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "ERY" "Erythromycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 9" 0.5 8 FALSE +"CLSI 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" "15ug" 21 21 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" 2 2048 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" "15ug" 27 24 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2016" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 5" 1 4 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "FEP" "Cefepime" "M45 Table 6" 1 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2016" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" 0.25 1 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2016" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2016" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2016" "MIC" "B_ABTRP" "Abiotrophia" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "GAT" "Gatifloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2016" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 5" 4 16 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2016" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2016" "MIC" "B_LCNST" "Leuconostoc" 3 "GEN" "Gentamicin" "M45 Table 10" 4 16 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 9" 4 16 FALSE +"CLSI 2016" "MIC" "B_PDCCC" "Pediococcus" 3 "GEN" "Gentamicin" "M45 Table 14" 4 16 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2016" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 16" 4 16 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 7" 4 16 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 3" 4 16 FALSE +"CLSI 2016" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 16" 4 16 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "IPM" "Imipenem" "M45 Table 5" 4 16 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "IPM" "Imipenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 5" 2 2048 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 9" 4 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" "10ug" 38 26 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" 0.125 2 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2016" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 8 FALSE +"CLSI 2016" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2016" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "LVX" "Levofloxacin" "M45 Table 6" 2 2048 FALSE +"CLSI 2016" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 12" 2 2048 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2016" "MIC" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2016" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2016" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2016" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2016" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 7" 4 16 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2016" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2016" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 5" 4 16 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "MEM" "Meropenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2016" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2016" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2016" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 10" 4 16 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2016" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2016" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" "5ug" 31 24 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" 0.25 2 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "MIC" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2016" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "ORI" "Oritavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "ORI" "Oritavancin" "Table 2H-1" 0.25 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ORI" "Oritavancin" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2016" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2016" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2016" "DISK" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 18 17 FALSE +"CLSI 2016" "MIC" "B_STPHY_PSDN" "Staphylococcus pseudintermedius" 2 "OXA" "Oxacillin" "Table 2C" 0.25 0.5 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2016" "DISK" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2016" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE +"CLSI 2016" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 16" 0.125 0.25 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 5" 1 4 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2016" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 2048 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2016" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2016" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" "10 units" 25 25 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2016" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2016" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2016" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2016" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PIP" "Piperacillin" "Table 2J" 32 128 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 2 4 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PLB" "Polymyxin B" "Table 2B-5" 2 8 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 2 8 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 5" 1 4 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 3" 1 4 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 5" 1 4 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 12" 1 4 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2016" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "SPT" "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2016" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2016" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2016" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2016" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 16" 4 16 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2016" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 2048 FALSE +"CLSI 2016" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2016" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2016" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 5" 2 4 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2016" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 11" 0.5 4 FALSE +"CLSI 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 0.5 4 FALSE +"CLSI 2016" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2016" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2016" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2016" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2016" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2016" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2016" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2016" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2016" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2016" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2016" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2016" "MIC" "B_EKNLL" "Eikenella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2016" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2016" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2016" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" "30ug" 29 24 FALSE +"CLSI 2016" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2016" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" 1 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2016" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2016" "DISK" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2016" "MIC" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2016" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2016" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" "15ug" 15 11 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" 4 16 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "TLV" "Telavancin" "Table 2D" "30ug" 15 15 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "TLV" "Telavancin" "Table 2D" 0.125 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "TLV" "Telavancin" "Table 2H-1" "30ug" 15 15 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TLV" "Telavancin" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TLV" "Telavancin" "Table 2H-2" "30ug" 15 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TLV" "Telavancin" "Table 2H-2" 0.125 2048 FALSE +"CLSI 2016" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2016" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2016" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "TZD" "Tedizolid" "Table 2D" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "TZD" "Tedizolid" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TZD" "Tedizolid" "Table 2H-2" 0.25 2048 FALSE +"CLSI 2016" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2016" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2016" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 32 128 FALSE +"CLSI 2016" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2016" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2016" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2016" "DISK" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2016" "MIC" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2016" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2016" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2016" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2016" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 3" 4 2048 FALSE +"CLSI 2016" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 5" 2 2048 FALSE +"CLSI 2016" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2016" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2016" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2016" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2016" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 9" 2 16 FALSE +"CLSI 2016" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2016" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2016" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2016" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2016" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2016" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2016" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2015" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 8 32 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" "20ug/10ug" 24 23 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" 4 8 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug/10ug" 27 27 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "AMP" "Ampicillin" "M45 Table 6" 0.25 2048 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2015" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2015" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2015" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" "10ug" 27 27 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" "15ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" 0.25 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" "15ug" 20 20 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" 1 2048 FALSE +"CLSI 2015" "DISK" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" "15ug" 13 12 FALSE +"CLSI 2015" "MIC" "B_SLMNL_ENTR" "Salmonella enterica" 2 "AZM" "Azithromycin" "Table 2A" 16 32 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "AZM" "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "CAZ" "Ceftazidime" "M45 Table 3" 8 32 FALSE +"CLSI 2015" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2015" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 16" 8 32 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 12" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2015" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 12" 8 32 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2015" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2015" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2015" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 10" 8 32 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 12" 2 8 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2015" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 14" 8 32 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" "30ug" 28 28 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" 2 2048 FALSE +"CLSI 2015" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2015" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 8 32 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2015" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CIP" "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2015" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 12" 1 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2015" "DISK" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2015" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2015" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2015" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 3" 0.5 4 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 5" 0.5 4 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CLI" "Clindamycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 9" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2015" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" "15ug" 24 24 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" 1 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" 2 8 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 2 4 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "COL" "Colistin" "Table 2B-5" 2 8 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" "10ug" 11 10 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2015" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRB" "Carbenicillin" "Table 2B-5" 16 64 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "CRO" "Ceftriaxone" "M45 Table 3" 8 64 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 5" 1 4 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CRO" "Ceftriaxone" "M45 Table 6" 1 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 12" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" "30ug" 34 34 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" 0.125 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2015" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "CTX" "Cefotaxime" "M45 Table 3" 8 64 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 5" 1 4 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CTX" "Cefotaxime" "M45 Table 6" 1 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 12" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2015" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2015" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 12" 4 16 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" "30ug" 31 25 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" 1 4 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2015" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2015" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "CZO" "Cefazolin" "M45 Table 3" 8 16 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 5" 1 2048 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 4 2048 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 2 8 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2015" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2015" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2015" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 3" 2 8 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 4 16 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2015" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2015" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "DOX" "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE +"CLSI 2015" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2015" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2015" "MIC" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" 0.25 2 FALSE +"CLSI 2015" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" "10ug" 36 31 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 3" 0.5 8 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 3" 8 32 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "ERY" "Erythromycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 9" 0.5 8 FALSE +"CLSI 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" "15ug" 21 21 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" 2 2048 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" "15ug" 27 24 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2015" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 5" 1 4 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "FEP" "Cefepime" "M45 Table 6" 1 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2015" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" 0.25 1 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2015" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2015" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2015" "MIC" "B_ABTRP" "Abiotrophia" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "GAT" "Gatifloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2015" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 5" 4 16 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2015" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2015" "MIC" "B_LCNST" "Leuconostoc" 3 "GEN" "Gentamicin" "M45 Table 10" 4 16 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 9" 4 16 FALSE +"CLSI 2015" "MIC" "B_PDCCC" "Pediococcus" 3 "GEN" "Gentamicin" "M45 Table 14" 4 16 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2015" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 16" 4 16 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 7" 4 16 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 3" 4 16 FALSE +"CLSI 2015" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 16" 4 16 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "IPM" "Imipenem" "M45 Table 5" 4 16 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "IPM" "Imipenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 5" 2 2048 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 9" 4 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" "10ug" 38 26 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" 0.125 2 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2015" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 8 FALSE +"CLSI 2015" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2015" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "LVX" "Levofloxacin" "M45 Table 6" 2 2048 FALSE +"CLSI 2015" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 12" 2 2048 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2015" "MIC" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2015" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2015" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2015" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2015" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 7" 4 16 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2015" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2015" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 5" 4 16 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "MEM" "Meropenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEZ" "Mezlocillin" "Table 2B-2" "75ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEZ" "Mezlocillin" "Table 2B-2" 16 128 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEZ" "Mezlocillin" "Table 2J" 32 128 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEZ" "Mezlocillin" "Table 2B-5" 16 128 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2015" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2015" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2015" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 10" 4 16 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2015" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2015" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" "5ug" 31 24 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" 0.25 2 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "MIC" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2015" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2015" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2015" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2015" "DISK" "B_SLMNL" "Salmonella" 3 "PEF" "Pefloxacin" "Table 2A" "5ug" 24 23 FALSE +"CLSI 2015" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE +"CLSI 2015" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 16" 0.125 0.25 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 5" 1 4 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2015" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 2048 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2015" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2015" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" "10 units" 25 25 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2015" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2015" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2015" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2015" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PIP" "Piperacillin" "Table 2J" 32 128 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 2 4 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PLB" "Polymyxin B" "Table 2B-5" 2 8 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 2 8 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 5" 1 4 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 3" 1 4 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 5" 1 4 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 12" 1 4 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2015" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "SPT" "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2015" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2015" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2015" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2015" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 16" 4 16 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2015" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 2048 FALSE +"CLSI 2015" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2015" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2015" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 5" 2 4 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2015" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 11" 0.5 4 FALSE +"CLSI 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 0.5 4 FALSE +"CLSI 2015" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2015" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2015" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2015" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2015" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2015" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2015" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2015" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2015" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2015" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2015" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2015" "MIC" "B_EKNLL" "Eikenella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2015" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2015" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2015" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" "30ug" 29 24 FALSE +"CLSI 2015" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2015" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" 1 2048 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2015" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "TIC" "Ticarcillin" "Table 2B-2" "75ug" 20 14 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "TIC" "Ticarcillin" "Table 2B-2" 16 128 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TIC" "Ticarcillin" "Table 2J" 32 128 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Table 2B-5" 16 128 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TIC" "Ticarcillin" "Table 2B-1" "75ug" 24 15 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TIC" "Ticarcillin" "Table 2B-1" 16 128 FALSE +"CLSI 2015" "DISK" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2015" "MIC" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2015" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2015" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" "15ug" 15 11 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" 4 16 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2015" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2015" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2015" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2015" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2015" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 32 128 FALSE +"CLSI 2015" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2015" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2015" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2015" "DISK" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2015" "MIC" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2015" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2015" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2015" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2015" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 3" 4 2048 FALSE +"CLSI 2015" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 5" 2 2048 FALSE +"CLSI 2015" "MIC" "B_CTBCTR_ACNS" "Cutibacterium acnes" 2 "VAN" "Vancomycin" "Table 2J-2" 2 4 FALSE +"CLSI 2015" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2015" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2015" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2015" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 9" 2 16 FALSE +"CLSI 2015" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2015" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2015" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2015" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2015" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2015" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2015" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2014" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 8 32 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" "20ug/10ug" 24 23 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" 4 8 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug/10ug" 27 27 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "AMP" "Ampicillin" "M45 Table 6" 0.25 2048 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2014" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2014" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2014" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" "10ug" 27 27 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" "15ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" 0.25 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" "15ug" 20 20 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" 1 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "AZM" "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "CAZ" "Ceftazidime" "M45 Table 3" 8 32 FALSE +"CLSI 2014" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2014" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 16" 8 32 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 12" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2014" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 12" 8 32 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2014" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2014" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2014" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 10" 8 32 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 12" 2 8 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2014" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 14" 8 32 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" "30ug" 28 28 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" 2 2048 FALSE +"CLSI 2014" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2014" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 8 32 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2014" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CIP" "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2014" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 12" 1 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2014" "DISK" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2014" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2014" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2014" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 3" 0.5 4 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 5" 0.5 4 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CLI" "Clindamycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 9" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2014" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" "15ug" 24 24 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" 1 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" 2 8 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 2 4 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "COL" "Colistin" "Table 2B-5" 2 8 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" "10ug" 11 10 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2014" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRB" "Carbenicillin" "Table 2B-5" 16 64 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "CRO" "Ceftriaxone" "M45 Table 3" 8 64 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 5" 1 4 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CRO" "Ceftriaxone" "M45 Table 6" 1 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 12" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" "30ug" 34 34 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" 0.125 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2014" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "CTX" "Cefotaxime" "M45 Table 3" 8 64 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 5" 1 4 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CTX" "Cefotaxime" "M45 Table 6" 1 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 12" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2014" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2014" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 12" 4 16 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" "30ug" 31 25 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" 1 4 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2014" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "DISK" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" "30ug" 15 14 TRUE +"CLSI 2014" "MIC" "UTI" "B_[ORD]_ENTRBCTR" "Enterobacterales" 5 "CZO" "Cefazolin" "Table 2A" 16 32 TRUE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "CZO" "Cefazolin" "M45 Table 3" 8 16 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 5" 1 2048 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 4 2048 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 2 8 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOR" "Doripenem" "Table 2B-2" 2 8 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2014" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2014" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2014" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 3" 2 8 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 4 16 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2014" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2014" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "DOX" "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE +"CLSI 2014" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2014" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2014" "MIC" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" 0.25 2 FALSE +"CLSI 2014" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" "10ug" 36 31 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 3" 0.5 8 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 3" 8 32 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "ERY" "Erythromycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 9" 0.5 8 FALSE +"CLSI 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" "15ug" 21 21 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" 2 2048 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" "15ug" 27 24 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2014" "MIC" "B_ABTRP" "Abiotrophia" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 5" 1 4 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "FEP" "Cefepime" "M45 Table 6" 1 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2014" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" 0.25 1 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2014" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2014" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2014" "MIC" "B_ABTRP" "Abiotrophia" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "GAT" "Gatifloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2014" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 5" 4 16 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2014" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2014" "MIC" "B_LCNST" "Leuconostoc" 3 "GEN" "Gentamicin" "M45 Table 10" 4 16 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 9" 4 16 FALSE +"CLSI 2014" "MIC" "B_PDCCC" "Pediococcus" 3 "GEN" "Gentamicin" "M45 Table 14" 4 16 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2014" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 16" 4 16 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 22 18 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 2 8 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 7" 4 16 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 3" 4 16 FALSE +"CLSI 2014" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 16" 4 16 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "IPM" "Imipenem" "M45 Table 5" 4 16 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "IPM" "Imipenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 5" 2 2048 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 9" 4 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" "10ug" 38 26 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" 0.125 2 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2014" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 8 FALSE +"CLSI 2014" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2014" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "LVX" "Levofloxacin" "M45 Table 6" 2 2048 FALSE +"CLSI 2014" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 12" 2 2048 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2014" "MIC" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2014" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2014" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2014" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2014" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 2 8 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 7" 4 16 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2014" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2014" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 5" 4 16 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "MEM" "Meropenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEZ" "Mezlocillin" "Table 2B-2" "75ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEZ" "Mezlocillin" "Table 2B-2" 16 128 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEZ" "Mezlocillin" "Table 2J" 32 128 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEZ" "Mezlocillin" "Table 2B-5" 16 128 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2014" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2014" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2014" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 10" 4 16 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2014" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2014" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" "5ug" 31 24 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" 0.25 2 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "MIC" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2014" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2014" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2014" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2014" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE +"CLSI 2014" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 16" 0.125 0.25 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 5" 1 4 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2014" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 2048 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2014" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2014" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" "10 units" 25 25 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2014" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2014" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2014" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2014" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PIP" "Piperacillin" "Table 2J" 32 128 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 2 4 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PLB" "Polymyxin B" "Table 2B-5" 2 8 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 2 8 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 5" 1 4 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 3" 1 4 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 5" 1 4 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 12" 1 4 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2014" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "SPT" "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2014" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2014" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2014" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2014" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 16" 4 16 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2014" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 2048 FALSE +"CLSI 2014" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2014" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2014" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 5" 2 4 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2014" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 11" 0.5 4 FALSE +"CLSI 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 0.5 4 FALSE +"CLSI 2014" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2014" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2014" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2014" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2014" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2014" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2014" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2014" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2014" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2014" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2014" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2014" "MIC" "B_EKNLL" "Eikenella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2014" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2014" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2014" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" "30ug" 29 24 FALSE +"CLSI 2014" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2014" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" 1 2048 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2014" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "TIC" "Ticarcillin" "Table 2B-2" "75ug" 20 14 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "TIC" "Ticarcillin" "Table 2B-2" 16 128 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TIC" "Ticarcillin" "Table 2J" 32 128 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Table 2B-5" 16 128 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TIC" "Ticarcillin" "Table 2B-1" "75ug" 24 15 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TIC" "Ticarcillin" "Table 2B-1" 16 128 FALSE +"CLSI 2014" "DISK" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2014" "MIC" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2014" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2014" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" "15ug" 15 11 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" 4 16 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2014" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2014" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2014" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2014" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2014" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 32 128 FALSE +"CLSI 2014" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2014" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2014" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2014" "DISK" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2014" "MIC" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2014" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2014" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2014" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2014" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 3" 4 2048 FALSE +"CLSI 2014" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 5" 2 2048 FALSE +"CLSI 2014" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2014" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2014" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2014" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 9" 2 16 FALSE +"CLSI 2014" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2014" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2014" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2014" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2014" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2014" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2014" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMC" "Amoxicillin/clavulanic acid" "Table 2J" 4 16 FALSE +"CLSI 2013" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 16" 8 32 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 7" 4 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" "20ug/10ug" 20 19 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "AMC" "Amoxicillin/clavulanic acid" "Table 2E" 4 8 FALSE +"CLSI 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" "20ug/10ug" 24 23 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 12" 4 8 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" "20ug/10ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" "20ug/10ug" 27 27 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "AMC" "Amoxicillin/clavulanic acid" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMC" "Amoxicillin/clavulanic acid" "Table 2G" 2 8 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" "30ug" 17 14 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "AMK" "Amikacin" "Table 2B-2" 16 64 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "AMK" "Amikacin" "M45 Table 3" 16 64 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "AMK" "Amikacin" "Table 2B-5" 16 64 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" "30ug" 17 14 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "AMK" "Amikacin" "M45 Table 2" 16 64 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" "30ug" 17 14 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "AMK" "Amikacin" "Table 2B-1" 16 64 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "AMP" "Ampicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "AMP" "Ampicillin" "M45 Table 3" 0.25 0.5 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "AMP" "Ampicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" "10ug" 17 16 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "AMP" "Ampicillin" "Table 2D" 8 16 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "AMP" "Ampicillin" "M45 Table 6" 0.25 2048 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" "10ug" 22 18 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "AMP" "Ampicillin" "Table 2E" 1 4 FALSE +"CLSI 2013" "MIC" "B_LCNST" "Leuconostoc" 3 "AMP" "Ampicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "AMP" "Ampicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2013" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "AMP" "Ampicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AMP" "Ampicillin" "Table 2I" 0.125 2 FALSE +"CLSI 2013" "MIC" "B_PDCCC" "Pediococcus" 3 "AMP" "Ampicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" "10ug" 27 27 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "AMP" "Ampicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "Table 2H-1" "10ug" 24 24 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "AMP" "Ampicillin" "M45 Table 1" 0.25 8 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AMP" "Ampicillin" "Table 2H-2" 0.25 8 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "AMX" "Amoxicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AMX" "Amoxicillin" "Table 2G" 2 8 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "ATM" "Aztreonam" "Table 2B-5" 8 32 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "ATM" "Aztreonam" "Table 2E" 2 2048 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "ATM" "Aztreonam" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" "30ug" 22 15 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "ATM" "Aztreonam" "Table 2B-1" 8 32 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" "15ug" 12 12 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "AZM" "Azithromycin" "Table 2E" 4 2048 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "AZM" "Azithromycin" "M45 Table 7" 4 2048 FALSE +"CLSI 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" "15ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "AZM" "Azithromycin" "M45 Table 12" 0.25 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" "15ug" 20 20 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "AZM" "Azithromycin" "Table 2I" 2 2048 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" "15ug" 20 20 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "AZM" "Azithromycin" "M45 Table 13" 1 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "AZM" "Azithromycin" "Table 2C" 2 8 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "AZM" "Azithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "AZM" "Azithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "AZM" "Azithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "AZM" "Azithromycin" "M45 Table 14" "30ug" 2 2048 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" "10ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CAT" "Cefetamet" "Table 2E" 4 16 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAT" "Cefetamet" "Table 2F" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "CAZ" "Ceftazidime" "Table 2B-2" 8 32 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "CAZ" "Ceftazidime" "M45 Table 3" 8 32 FALSE +"CLSI 2013" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" "30ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CAZ" "Ceftazidime" "Table 2B-3" 8 32 FALSE +"CLSI 2013" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "CAZ" "Ceftazidime" "M45 Table 16" 8 32 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CAZ" "Ceftazidime" "Table 2B-5" 8 32 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CAZ" "Ceftazidime" "Table 2E" 2 2048 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CAZ" "Ceftazidime" "M45 Table 12" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CAZ" "Ceftazidime" "Table 2F" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" "30ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "CAZ" "Ceftazidime" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CAZ" "Ceftazidime" "Table 2B-1" 8 32 FALSE +"CLSI 2013" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CAZ" "Ceftazidime" "Table 2B-4" 8 32 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" "5ug" 20 20 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CDR" "Cefdinir" "Table 2E" 1 2048 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CDR" "Cefdinir" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CEC" "Cefaclor" "Table 2E" 8 32 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CEC" "Cefaclor" "M45 Table 12" 8 32 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CEC" "Cefaclor" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CFM" "Cefixime" "Table 2E" 1 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" "5ug" 31 31 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CFM" "Cefixime" "Table 2F" 0.25 2048 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CFP" "Cefoperazone" "Table 2J" 16 64 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CFP" "Cefoperazone" "Table 2B-5" 16 64 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CHL" "Chloramphenicol" "Table 2J" 8 32 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "CHL" "Chloramphenicol" "M45 Table 3" 8 32 FALSE +"CLSI 2013" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "CHL" "Chloramphenicol" "Table 2B-3" 8 32 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" "30ug" 18 12 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "CHL" "Chloramphenicol" "Table 2D" 8 32 FALSE +"CLSI 2013" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CHL" "Chloramphenicol" "M45 Table 16" 8 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CHL" "Chloramphenicol" "Table 2B-5" 8 32 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CHL" "Chloramphenicol" "Table 2E" 2 8 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "CHL" "Chloramphenicol" "M45 Table 7" 4 16 FALSE +"CLSI 2013" "MIC" "B_LCNST" "Leuconostoc" 3 "CHL" "Chloramphenicol" "M45 Table 10" 8 32 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CHL" "Chloramphenicol" "M45 Table 12" 2 8 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" "30ug" 26 19 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CHL" "Chloramphenicol" "Table 2I" 2 8 FALSE +"CLSI 2013" "MIC" "B_PDCCC" "Pediococcus" 3 "CHL" "Chloramphenicol" "M45 Table 14" 8 32 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" "30ug" 18 12 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "CHL" "Chloramphenicol" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" "30ug" 28 28 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "CHL" "Chloramphenicol" "M45 Table 13" 2 2048 FALSE +"CLSI 2013" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "CHL" "Chloramphenicol" "Table 2B-4" 8 32 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" "30ug" 18 12 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "CHL" "Chloramphenicol" "Table 2C" 8 32 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "Table 2H-1" "30ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CHL" "Chloramphenicol" "M45 Table 1" 4 8 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" "30ug" 21 20 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CHL" "Chloramphenicol" "Table 2G" 4 8 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" "30ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CHL" "Chloramphenicol" "Table 2H-2" 4 16 FALSE +"CLSI 2013" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CHL" "Chloramphenicol" "M45 Table 16" 8 32 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CID" "Cefonicid" "Table 2E" 4 16 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" "5ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "CIP" "Ciprofloxacin" "Table 2B-2" 1 4 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2013" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "CIP" "Ciprofloxacin" "M45 Table 3" 1 4 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" "5ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "CIP" "Ciprofloxacin" "Table 2D" 1 4 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CIP" "Ciprofloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2013" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "CIP" "Ciprofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CIP" "Ciprofloxacin" "Table 2B-5" 1 4 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" "5ug" 21 21 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CIP" "Ciprofloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "CIP" "Ciprofloxacin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CIP" "Ciprofloxacin" "M45 Table 12" 1 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" "5ug" 41 27 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CIP" "Ciprofloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" "5ug" 35 32 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CIP" "Ciprofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" "5ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "CIP" "Ciprofloxacin" "M45 Table 2" 1 4 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" "5ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "CIP" "Ciprofloxacin" "Table 2B-1" 1 4 FALSE +"CLSI 2013" "DISK" "Intestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 21 15 FALSE +"CLSI 2013" "DISK" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2013" "DISK" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" "5ug" 31 20 FALSE +"CLSI 2013" "MIC" "Intestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 1 4 FALSE +"CLSI 2013" "MIC" "Extraintestinal" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2013" "MIC" "B_SLMNL" "Salmonella" 3 "CIP" "Ciprofloxacin" "Table 2A" 0.064 1 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" "5ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "CIP" "Ciprofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CIP" "Ciprofloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "CIP" "Ciprofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CLI" "Clindamycin" "Table 2J" 2 8 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "CLI" "Clindamycin" "M45 Table 3" 0.5 4 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "CLI" "Clindamycin" "M45 Table 5" 0.5 4 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CLI" "Clindamycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "CLI" "Clindamycin" "M45 Table 9" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLI" "Clindamycin" "M45 Table 12" 0.5 4 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" "2ug" 21 14 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "CLI" "Clindamycin" "Table 2C" 0.5 4 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "Table 2H-1" "2ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CLI" "Clindamycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" "2ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLI" "Clindamycin" "Table 2G" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" "2ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLI" "Clindamycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2013" "MIC" "B_HLCBCT_PYLR" "Helicobacter pylori" 2 "CLR" "Clarithromycin" "M45 Table 8" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" "15ug" 13 10 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CLR" "Clarithromycin" "Table 2E" 8 32 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "CLR" "Clarithromycin" "M45 Table 7" 8 32 FALSE +"CLSI 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" "15ug" 24 24 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CLR" "Clarithromycin" "M45 Table 12" 1 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" "15ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "CLR" "Clarithromycin" "Table 2C" 2 8 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" "15ug" 21 16 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CLR" "Clarithromycin" "Table 2H-1" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" "15ug" 21 16 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CLR" "Clarithromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" "15ug" 21 16 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CLR" "Clarithromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CMZ" "Cefmetazole" "Table 2J" 16 64 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" "30ug" 33 27 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CMZ" "Cefmetazole" "Table 2F" 2 8 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "COL" "Colistin" "Table 2B-2" 2 4 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "COL" "Colistin" "Table 2B-5" 2 8 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" "10ug" 11 10 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "COL" "Colistin" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" "10ug" 21 21 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CPD" "Cefpodoxime" "Table 2E" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" "10ug" 29 29 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CPD" "Cefpodoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPD" "Cefpodoxime" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CPR" "Cefprozil" "Table 2E" 8 32 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPR" "Cefprozil" "Table 2G" 2 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" "30ug" 30 30 FALSE +"CLSI 2013" "MIC" "B_HMPHL_INFL" "Haemophilus influenzae" 2 "CPT" "Ceftaroline" "Table 2E" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" "30ug" 24 20 FALSE +"CLSI 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "CPT" "Ceftaroline" "Table 2C" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" "30ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CPT" "Ceftaroline" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CPT" "Ceftaroline" "Table 2G" 0.5 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRB" "Carbenicillin" "Table 2B-5" 16 64 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" "30ug" 21 13 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "CRO" "Ceftriaxone" "Table 2B-2" 8 64 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CRO" "Ceftriaxone" "Table 2J" 16 64 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "CRO" "Ceftriaxone" "M45 Table 3" 8 64 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "CRO" "Ceftriaxone" "M45 Table 5" 1 4 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CRO" "Ceftriaxone" "M45 Table 6" 1 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CRO" "Ceftriaxone" "Table 2B-5" 8 64 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CRO" "Ceftriaxone" "Table 2E" 2 2048 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "CRO" "Ceftriaxone" "M45 Table 7" 2 2048 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CRO" "Ceftriaxone" "M45 Table 12" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" "30ug" 35 35 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CRO" "Ceftriaxone" "Table 2F" 0.25 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CRO" "Ceftriaxone" "Table 2I" 0.125 2048 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" "30ug" 23 19 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "CRO" "Ceftriaxone" "M45 Table 2" 1 4 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" "30ug" 34 34 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "CRO" "Ceftriaxone" "M45 Table 13" 0.125 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CRO" "Ceftriaxone" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2013" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CRO" "Ceftriaxone" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" "30ug" 27 24 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CRO" "Ceftriaxone" "Table 2H-2" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" "30ug" 28 28 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CTB" "Ceftibuten" "Table 2E" 2 2048 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTT" "Cefotetan" "Table 2J" 16 64 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" "30ug" 26 19 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTT" "Cefotetan" "Table 2F" 2 8 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" "30ug" 23 14 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "CTX" "Cefotaxime" "Table 2B-2" 8 64 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CTX" "Cefotaxime" "Table 2J" 16 64 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "CTX" "Cefotaxime" "M45 Table 3" 8 64 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "CTX" "Cefotaxime" "M45 Table 5" 1 4 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "CTX" "Cefotaxime" "M45 Table 6" 1 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CTX" "Cefotaxime" "Table 2B-5" 8 64 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CTX" "Cefotaxime" "Table 2E" 2 2048 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "CTX" "Cefotaxime" "M45 Table 7" 2 2048 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CTX" "Cefotaxime" "M45 Table 12" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CTX" "Cefotaxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" "30ug" 34 34 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "CTX" "Cefotaxime" "Table 2I" 0.125 2048 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" "30ug" 26 22 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "CTX" "Cefotaxime" "M45 Table 2" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "CTX" "Cefotaxime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2013" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CTX" "Cefotaxime" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" "30ug" 28 25 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "CTX" "Cefotaxime" "Table 2H-2" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CXA" "Cefuroxime axetil" "Table 2E" 4 16 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXA" "Cefuroxime axetil" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "DISK" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" "30ug" 20 16 FALSE +"CLSI 2013" "MIC" "Oral" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CXM" "Cefuroxime" "Table 2E" 4 16 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "CXM" "Cefuroxime" "M45 Table 12" 4 16 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" "30ug" 31 25 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CXM" "Cefuroxime" "Table 2F" 1 4 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "CXM" "Cefuroxime" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 1 4 FALSE +"CLSI 2013" "MIC" "Parenteral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "CXM" "Cefuroxime" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "CZO" "Cefazolin" "M45 Table 3" 8 16 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "CZO" "Cefazolin" "M45 Table 2" 1 4 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "CZX" "Ceftizoxime" "Table 2J" 32 128 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "CZX" "Ceftizoxime" "Table 2B-5" 8 64 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "CZX" "Ceftizoxime" "Table 2E" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" "30ug" 38 38 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "CZX" "Ceftizoxime" "Table 2F" 0.5 2048 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "DAP" "Daptomycin" "M45 Table 5" 1 2048 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "DAP" "Daptomycin" "Table 2D" 4 2048 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "DAP" "Daptomycin" "M45 Table 9" 4 2048 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "DAP" "Daptomycin" "Table 2C" 1 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "DAP" "Daptomycin" "Table 2H-1" "30ug" 16 16 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DAP" "Daptomycin" "Table 2H-2" 1 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" "15ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "DIR" "Dirithromycin" "Table 2C" 2 8 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" "15ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "DIR" "Dirithromycin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" "15ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DIR" "Dirithromycin" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" "15ug" 18 13 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DIR" "Dirithromycin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "DOR" "Doripenem" "Table 2J" 2 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "DOR" "Doripenem" "Table 2E" 1 2048 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "DOR" "Doripenem" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "DOR" "Doripenem" "Table 2H-1" 0.125 2048 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOR" "Doripenem" "Table 2G" 1 2048 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "DOR" "Doripenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" "30ug" 13 9 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "DOX" "Doxycycline" "Table 2B-2" 4 16 FALSE +"CLSI 2013" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2013" "MIC" "B_BRCLL" "Brucella" 3 "DOX" "Doxycycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2013" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 3" 2 8 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "DOX" "Doxycycline" "M45 Table 5" 4 16 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" "30ug" 16 12 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "DOX" "Doxycycline" "Table 2D" 4 16 FALSE +"CLSI 2013" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "DOX" "Doxycycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "DOX" "Doxycycline" "Table 2B-5" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "DOX" "Doxycycline" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" "30ug" 16 12 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "DOX" "Doxycycline" "Table 2C" 4 16 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "DOX" "Doxycycline" "Table 2G" 0.25 1 FALSE +"CLSI 2013" "MIC" "B_VIBRI_CHLR" "Vibrio cholerae" 2 "DOX" "Doxycycline" "M45 Table 14" "30ug" 4 16 FALSE +"CLSI 2013" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "DOX" "Doxycycline" "M45 Table 16" 4 16 FALSE +"CLSI 2013" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2013" "MIC" "B_HSTPH_SOMN" "Histophilus somni" 2 "ENR" "Enrofloxacin" "Vet Table" 0.25 2 FALSE +"CLSI 2013" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "ENR" "Enrofloxacin" "Vet Table" "5ug" 21 16 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" "10ug" 36 31 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "ENX" "Enoxacin" "Table 2F" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" "10ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "ENX" "Enoxacin" "Table 2C" 2 8 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "ERY" "Erythromycin" "M45 Table 3" 0.5 8 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 3" 8 32 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "ERY" "Erythromycin" "M45 Table 5" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" "15ug" 23 13 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "ERY" "Erythromycin" "Table 2D" 0.5 8 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "ERY" "Erythromycin" "M45 Table 6" 0.25 1 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "ERY" "Erythromycin" "M45 Table 9" 0.5 8 FALSE +"CLSI 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" "15ug" 21 21 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "ERY" "Erythromycin" "M45 Table 12" 2 2048 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" "15ug" 27 24 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "ERY" "Erythromycin" "M45 Table 13" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" "15ug" 23 13 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "ERY" "Erythromycin" "Table 2C" 0.5 8 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "Table 2H-1" "15ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "ERY" "Erythromycin" "M45 Table 1" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" "15ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ERY" "Erythromycin" "Table 2G" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" "15ug" 21 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ERY" "Erythromycin" "Table 2H-2" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "ETP" "Ertapenem" "Table 2J" 4 16 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" "10ug" 19 19 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "ETP" "Ertapenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" "10ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "ETP" "Ertapenem" "M45 Table 2" 2 8 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "ETP" "Ertapenem" "Table 2H-1" 1 2048 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "ETP" "Ertapenem" "Table 2G" 1 4 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "ETP" "Ertapenem" "Table 2H-2" 1 2048 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "FEP" "Cefepime" "Table 2B-2" 8 32 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "FEP" "Cefepime" "M45 Table 5" 1 4 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "FEP" "Cefepime" "M45 Table 6" 1 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "FEP" "Cefepime" "Table 2B-5" 8 32 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" "30ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "FEP" "Cefepime" "Table 2E" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" "30ug" 31 31 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FEP" "Cefepime" "Table 2F" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "FEP" "Cefepime" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "FEP" "Cefepime" "Table 2B-1" 8 32 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" "30ug" 24 24 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "FEP" "Cefepime" "Table 2H-1" 0.5 2048 FALSE +"CLSI 2013" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "FEP" "Cefepime" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" "30ug" 24 21 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "FEP" "Cefepime" "Table 2H-2" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" "5ug" 19 19 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "FLE" "Fleroxacin" "Table 2E" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" "5ug" 35 28 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FLE" "Fleroxacin" "Table 2F" 0.25 1 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "FLE" "Fleroxacin" "Table 2C" 2 8 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" "200ug" 16 12 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "FOS" "Fosfomycin" "Table 2D" 64 256 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "FOX" "Cefoxitin" "Table 2J" 16 64 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" "30ug" 28 23 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "FOX" "Cefoxitin" "Table 2F" 2 8 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" "30ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "FOX" "Cefoxitin" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" "30ug" 25 24 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2013" "DISK" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" "30ug" 22 21 FALSE +"CLSI 2013" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "FOX" "Cefoxitin" "Table 2C" 4 8 FALSE +"CLSI 2013" "MIC" "B_ABTRP" "Abiotrophia" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" "5ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "GAT" "Gatifloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" "5ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "GAT" "Gatifloxacin" "Table 2D" 2 8 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "GAT" "Gatifloxacin" "M45 Table 6" 1 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GAT" "Gatifloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "GAT" "Gatifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" "5ug" 38 33 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GAT" "Gatifloxacin" "Table 2F" 0.125 0.5 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" "5ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GAT" "Gatifloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" "5ug" 23 19 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "GAT" "Gatifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "Table 2H-1" "5ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "GAT" "Gatifloxacin" "M45 Table 1" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" "5ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GAT" "Gatifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" "5ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GAT" "Gatifloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" "120ug" 10 6 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "GEH" "Gentamicin-high" "Table 2D" 512 560 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "GEM" "Gemifloxacin" "Table 2E" 0.125 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" "5ug" 23 19 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GEM" "Gemifloxacin" "Table 2G" 0.125 0.5 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "GEN" "Gentamicin" "Table 2B-2" 4 16 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "GEN" "Gentamicin" "M45 Table 3" 4 16 FALSE +"CLSI 2013" "MIC" "B_BRCLL" "Brucella" 3 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "GEN" "Gentamicin" "M45 Table 5" 4 16 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "GEN" "Gentamicin" "Table 2D" 512 560 FALSE +"CLSI 2013" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "GEN" "Gentamicin" "M45 Table 16" 4 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "GEN" "Gentamicin" "Table 2B-5" 4 16 FALSE +"CLSI 2013" "MIC" "B_LCNST" "Leuconostoc" 3 "GEN" "Gentamicin" "M45 Table 10" 4 16 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "GEN" "Gentamicin" "M45 Table 9" 4 16 FALSE +"CLSI 2013" "MIC" "B_PDCCC" "Pediococcus" 3 "GEN" "Gentamicin" "M45 Table 14" 4 16 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" "10ug" 15 12 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "GEN" "Gentamicin" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "GEN" "Gentamicin" "Table 2B-1" 4 16 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" "10ug" 15 12 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "GEN" "Gentamicin" "Table 2C" 4 16 FALSE +"CLSI 2013" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "GEN" "Gentamicin" "M45 Table 16" 4 16 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" "5ug" 24 24 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "GRX" "Grepafloxacin" "Table 2E" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" "5ug" 37 27 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "GRX" "Grepafloxacin" "Table 2F" 0.064 1 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "GRX" "Grepafloxacin" "Table 2C" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" "5ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "GRX" "Grepafloxacin" "Table 2H-1" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "GRX" "Grepafloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" "5ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "GRX" "Grepafloxacin" "Table 2H-2" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_ABTRP" "Abiotrophia" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" "10ug" 16 13 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "IPM" "Imipenem" "Table 2B-2" 4 16 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "IPM" "Imipenem" "M45 Table 7" 4 16 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "IPM" "Imipenem" "Table 2J" 4 16 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "IPM" "Imipenem" "M45 Table 3" 4 16 FALSE +"CLSI 2013" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "IPM" "Imipenem" "M45 Table 16" 4 16 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "IPM" "Imipenem" "M45 Table 5" 4 16 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "IPM" "Imipenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "IPM" "Imipenem" "Table 2B-5" 4 16 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" "10ug" 16 16 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "IPM" "Imipenem" "Table 2E" 4 2048 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "IPM" "Imipenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "IPM" "Imipenem" "M45 Table 9" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_PDCCC" "Pediococcus" 3 "IPM" "Imipenem" "M45 Table 14" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "IPM" "Imipenem" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "IPM" "Imipenem" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "IPM" "Imipenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "IPM" "Imipenem" "Table 2G" 0.125 1 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "LNZ" "Linezolid" "M45 Table 5" 2 2048 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" "30ug" 23 20 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "LNZ" "Linezolid" "Table 2D" 2 8 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "LNZ" "Linezolid" "M45 Table 9" 4 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" "30ug" 21 20 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "LNZ" "Linezolid" "Table 2C" 4 8 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" "30ug" 21 21 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "LNZ" "Linezolid" "Table 2H-1" 2 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" "30ug" 21 21 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LNZ" "Linezolid" "Table 2G" 2 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" "30ug" 21 21 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LNZ" "Linezolid" "Table 2H-2" 2 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LOM" "Lomefloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "LOM" "Lomefloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" "10ug" 38 26 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "LOM" "Lomefloxacin" "Table 2F" 0.125 2 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" "10ug" 22 18 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LOM" "Lomefloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" "10ug" 22 18 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "LOM" "Lomefloxacin" "Table 2C" 2 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" "30ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "LOR" "Loracarbef" "Table 2E" 8 32 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LOR" "Loracarbef" "Table 2G" 2 8 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "LTM" "Latamoxef" "Table 2J" 2 8 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LTM" "Latamoxef" "Table 2B-5" 8 64 FALSE +"CLSI 2013" "MIC" "B_ABTRP" "Abiotrophia" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "LVX" "Levofloxacin" "Table 2B-2" 2 8 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "LVX" "Levofloxacin" "M45 Table 3" 2 8 FALSE +"CLSI 2013" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2013" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "LVX" "Levofloxacin" "Table 2B-3" 2 8 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "LVX" "Levofloxacin" "Table 2D" 2 8 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "LVX" "Levofloxacin" "M45 Table 6" 2 2048 FALSE +"CLSI 2013" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "LVX" "Levofloxacin" "M45 Table 16" 0.5 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "LVX" "Levofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" "5ug" 17 17 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "LVX" "Levofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "LVX" "Levofloxacin" "M45 Table 7" 2 8 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "LVX" "Levofloxacin" "M45 Table 12" 2 2048 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "LVX" "Levofloxacin" "Table 2I" 0.032 0.12 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "LVX" "Levofloxacin" "M45 Table 2" 2 8 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "LVX" "Levofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "LVX" "Levofloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2013" "MIC" "B_SLMNL" "Salmonella" 3 "LVX" "Levofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2013" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "LVX" "Levofloxacin" "Table 2B-4" 2 8 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "LVX" "Levofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "Table 2H-1" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "LVX" "Levofloxacin" "M45 Table 1" 2 8 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "LVX" "Levofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" "5ug" 17 13 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "LVX" "Levofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2013" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "LVX" "Levofloxacin" "M45 Table 16" 0.25 2048 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "MAN" "Cefamandole" "Table 2E" 4 16 FALSE +"CLSI 2013" "MIC" "B_ABTRP" "Abiotrophia" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" "10ug" 16 13 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEM" "Meropenem" "Table 2B-2" 4 16 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "MEM" "Meropenem" "M45 Table 7" 4 16 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEM" "Meropenem" "Table 2J" 4 16 FALSE +"CLSI 2013" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" "10ug" 20 15 FALSE +"CLSI 2013" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MEM" "Meropenem" "Table 2B-3" 4 16 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "MEM" "Meropenem" "M45 Table 5" 4 16 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "MEM" "Meropenem" "M45 Table 6" 0.5 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEM" "Meropenem" "Table 2B-5" 4 16 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" "10ug" 20 20 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "MEM" "Meropenem" "Table 2E" 0.5 2048 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "MEM" "Meropenem" "M45 Table 7" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" "10ug" 30 30 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MEM" "Meropenem" "Table 2I" 0.25 2048 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" "10ug" 16 13 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "MEM" "Meropenem" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" "10ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "MEM" "Meropenem" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "MEM" "Meropenem" "M45 Table 1" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MEM" "Meropenem" "Table 2G" 0.25 1 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "MEM" "Meropenem" "Table 2H-2" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "MEZ" "Mezlocillin" "Table 2B-2" "75ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "MEZ" "Mezlocillin" "Table 2B-2" 16 128 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MEZ" "Mezlocillin" "Table 2J" 32 128 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MEZ" "Mezlocillin" "Table 2B-5" 16 128 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" "5ug" 18 18 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "MFX" "Moxifloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" "5ug" 28 28 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "MFX" "Moxifloxacin" "M45 Table 13" 0.064 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" "5ug" 24 20 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "MFX" "Moxifloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" "5ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "MFX" "Moxifloxacin" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" "30ug" 16 12 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "MNO" "Minocycline" "Table 2B-2" 4 16 FALSE +"CLSI 2013" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" "30ug" 19 14 FALSE +"CLSI 2013" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "MNO" "Minocycline" "Table 2B-3" 4 16 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "MNO" "Minocycline" "Table 2D" 4 16 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "MNO" "Minocycline" "Table 2B-5" 4 16 FALSE +"CLSI 2013" "MIC" "B_LCNST" "Leuconostoc" 3 "MNO" "Minocycline" "M45 Table 10" 4 16 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" "30ug" 26 26 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "MNO" "Minocycline" "Table 2I" 2 2048 FALSE +"CLSI 2013" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" "30ug" 19 14 FALSE +"CLSI 2013" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "MNO" "Minocycline" "Table 2B-4" 4 16 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "MNO" "Minocycline" "Table 2C" 4 16 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "MTR" "Metronidazole" "Table 2J" 8 32 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" "30ug" 26 25 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "NAL" "Nalidixic acid" "Table 2I" 4 8 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "NET" "Netilmicin" "Table 2B-2" 8 32 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NET" "Netilmicin" "Table 2B-5" 8 32 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" "30ug" 15 12 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NET" "Netilmicin" "Table 2B-1" 8 32 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" "300ug" 17 14 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "NIT" "Nitrofurantoin" "Table 2D" 32 128 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" "300ug" 17 14 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "NIT" "Nitrofurantoin" "Table 2C" 32 128 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" "10ug" 17 12 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "NOR" "Norfloxacin" "Table 2D" 4 16 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "NOR" "Norfloxacin" "Table 2B-5" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" "10ug" 17 12 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "NOR" "Norfloxacin" "Table 2B-1" 4 16 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" "10ug" 17 12 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "NOR" "Norfloxacin" "Table 2C" 4 16 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "OFX" "Ofloxacin" "Table 2B-5" 2 8 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" "5ug" 16 16 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "OFX" "Ofloxacin" "Table 2E" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" "5ug" 31 24 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "OFX" "Ofloxacin" "Table 2F" 0.25 2 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" "5ug" 16 12 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "OFX" "Ofloxacin" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "MIC" "B_SLMNL" "Salmonella" 3 "OFX" "Ofloxacin" "Table 2A" 0.125 2 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" "5ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "OFX" "Ofloxacin" "Table 2C" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" "5ug" 16 12 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "OFX" "Ofloxacin" "Table 2H-1" 2 8 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" "5ug" 16 12 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OFX" "Ofloxacin" "Table 2G" 2 8 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" "5ug" 16 12 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "OFX" "Ofloxacin" "Table 2H-2" 2 8 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2013" "DISK" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" "1ug" 13 10 FALSE +"CLSI 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2013" "MIC" "B_STPHY_LGDN" "Staphylococcus lugdunensis" 2 "OXA" "Oxacillin" "Table 2C" 2 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "OXA" "Oxacillin" "Table 2G" "1ug" 20 20 FALSE +"CLSI 2013" "MIC" "B_ABTRP" "Abiotrophia" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PEN" "Benzylpenicillin" "Table 2J" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 3" 0.125 0.25 FALSE +"CLSI 2013" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "PEN" "Benzylpenicillin" "M45 Table 16" 0.125 0.25 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "PEN" "Benzylpenicillin" "M45 Table 5" 1 4 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" "10 units" 15 14 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "PEN" "Benzylpenicillin" "Table 2D" 8 16 FALSE +"CLSI 2013" "MIC" "B_ERYSP_RHSP" "Erysipelothrix rhusiopathiae" 2 "PEN" "Benzylpenicillin" "M45 Table 6" 0.125 2048 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "PEN" "Benzylpenicillin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_LCNST" "Leuconostoc" 3 "PEN" "Benzylpenicillin" "M45 Table 10" 8 2048 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "PEN" "Benzylpenicillin" "M45 Table 9" 8 2048 FALSE +"CLSI 2013" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "PEN" "Benzylpenicillin" "M45 Table 11" 2 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" "10 units" 47 26 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "PEN" "Benzylpenicillin" "Table 2F" 0.064 2 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "PEN" "Benzylpenicillin" "Table 2I" 0.064 0.5 FALSE +"CLSI 2013" "MIC" "B_PDCCC" "Pediococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 14" 8 2048 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" "10 units" 25 25 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "PEN" "Benzylpenicillin" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" "10 units" 29 28 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "PEN" "Benzylpenicillin" "Table 2C" 0.125 0.25 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "Table 2H-1" "10 units" 24 24 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "PEN" "Benzylpenicillin" "M45 Table 1" 0.125 4 FALSE +"CLSI 2013" "MIC" "Meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 0.12 FALSE +"CLSI 2013" "MIC" "Non-meningitis" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 2 8 FALSE +"CLSI 2013" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PEN" "Benzylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "PEN" "Benzylpenicillin" "Table 2H-2" 0.125 4 FALSE +"CLSI 2013" "MIC" "Oral" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "PHN" "Phenoxymethylpenicillin" "Table 2G" 0.064 2 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" "100ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "PIP" "Piperacillin" "Table 2B-2" 16 128 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "PIP" "Piperacillin" "Table 2J" 32 128 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PIP" "Piperacillin" "Table 2B-5" 16 128 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" "100ug" 21 14 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PIP" "Piperacillin" "Table 2B-1" 16 128 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "PLB" "Polymyxin B" "Table 2B-2" 2 4 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "PLB" "Polymyxin B" "Table 2B-5" 2 8 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" "300ug" 12 11 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "PLB" "Polymyxin B" "Table 2B-1" 2 8 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "QDA" "Quinupristin/dalfopristin" "M45 Table 5" 1 4 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" "15ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2D" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" "15ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "QDA" "Quinupristin/dalfopristin" "Table 2H-1" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "QDA" "Quinupristin/dalfopristin" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" "15ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "QDA" "Quinupristin/dalfopristin" "Table 2H-2" 1 4 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "RIF" "Rifampicin" "M45 Table 3" 1 4 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "RIF" "Rifampicin" "M45 Table 5" 1 4 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" "5ug" 20 16 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "RIF" "Rifampicin" "Table 2D" 1 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" "5ug" 20 16 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "RIF" "Rifampicin" "Table 2E" 1 4 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "RIF" "Rifampicin" "M45 Table 7" 1 4 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "RIF" "Rifampicin" "M45 Table 12" 1 4 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" "5ug" 25 19 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "RIF" "Rifampicin" "Table 2I" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" "5ug" 20 16 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "RIF" "Rifampicin" "Table 2C" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" "5ug" 19 16 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "RIF" "Rifampicin" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" "10ug" 15 11 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "SAM" "Ampicillin/sulbactam" "Table 2B-2" 8 32 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "SAM" "Ampicillin/sulbactam" "Table 2J" 8 32 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 7" 2 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" "10ug/10ug" 20 19 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "SAM" "Ampicillin/sulbactam" "Table 2E" 2 4 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" "10ug" 15 11 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "SAM" "Ampicillin/sulbactam" "M45 Table 2" 8 32 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SMX" "Sulfamethoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SMX" "Sulfamethoxazole" "Table 2I" 2 8 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "SMX" "Sulfamethoxazole" "Table 2C" 256 512 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SOX" "Sulfisoxazole" "Table 2B-5" 256 512 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SOX" "Sulfisoxazole" "Table 2I" 2 8 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "SOX" "Sulfisoxazole" "Table 2C" 256 512 FALSE +"CLSI 2013" "DISK" "B_HSTPH_SOMN" "Histophilus somni" 2 "SPT" "Spectinomycin" "Vet Table" "100ug" 14 10 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" "100ug" 18 14 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "SPT" "Spectinomycin" "Table 2F" 32 128 FALSE +"CLSI 2013" "DISK" "B_PRVDN_HMBC" "Providencia heimbachae" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "SPT" "Spectinomycin" "100ug" 14 10 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "SPX" "Sparfloxacin" "Table 2E" 0.25 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" "5ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "SPX" "Sparfloxacin" "Table 2C" 0.5 2 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" "5ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SPX" "Sparfloxacin" "Table 2G" 0.5 2 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SSS" "Sulfonamide" "Table 2B-5" 256 512 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SSS" "Sulfonamide" "Table 2I" 2 8 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" "200ug" 17 12 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "SSS" "Sulfonamide" "Table 2C" 256 512 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" "300ug" 10 6 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "STH" "Streptomycin-high" "Table 2D" 1024 2048 FALSE +"CLSI 2013" "MIC" "B_BRCLL" "Brucella" 3 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "STR" "Streptoduocin" "Table 2D" 1024 2048 FALSE +"CLSI 2013" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "STR" "Streptoduocin" "M45 Table 16" 8 2048 FALSE +"CLSI 2013" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "STR" "Streptoduocin" "M45 Table 16" 4 16 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-2" 2 4 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 3" 2 4 FALSE +"CLSI 2013" "MIC" "B_BRCLL" "Brucella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 2048 FALSE +"CLSI 2013" "DISK" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2013" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-3" 2 4 FALSE +"CLSI 2013" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 5" 2 4 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-5" 2 4 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" "1.25ug/23.75ug" 15 10 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2E" 0.5 4 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 7" 0.5 4 FALSE +"CLSI 2013" "MIC" "B_LISTR_MNCY" "Listeria monocytogenes" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 11" 0.5 4 FALSE +"CLSI 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" "1.25ug/23.75ug" 13 10 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 12" 0.5 4 FALSE +"CLSI 2013" "DISK" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" "1.25ug/23.75ug" 30 25 FALSE +"CLSI 2013" "MIC" "B_NESSR_MNNG" "Neisseria meningitidis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2I" 0.125 0.5 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 2" 2 4 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" "1.25ug/23.75ug" 24 24 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 13" 0.5 2048 FALSE +"CLSI 2013" "DISK" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2013" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2B-4" 2 4 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" "1.25ug/23.75ug" 16 10 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2C" 2 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" "1.25ug/23.75ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "SXT" "Trimethoprim/sulfamethoxazole" "Table 2G" 0.5 4 FALSE +"CLSI 2013" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "SXT" "Trimethoprim/sulfamethoxazole" "M45 Table 16" 2 4 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" "75/10-15ug" 20 14 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-2" 16 128 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2J" 32 128 FALSE +"CLSI 2013" "MIC" "B_BRKHL_CEPC" "Burkholderia cepacia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-3" 16 128 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-5" 16 128 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" "75/10-15ug" 24 15 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-1" 16 128 FALSE +"CLSI 2013" "MIC" "B_STNTR_MLTP" "Stenotrophomonas maltophilia" 2 "TCC" "Ticarcillin/clavulanic acid" "Table 2B-4" 16 128 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" "30ug" 15 11 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "TCY" "Tetracycline" "Table 2B-2" 4 16 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "MIC" "B_AGGRG" "Aggregatibacter" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TCY" "Tetracycline" "Table 2J" 4 16 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2013" "MIC" "B_BCLLS_ANTH" "Bacillus anthracis" 2 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2013" "MIC" "B_BRCLL" "Brucella" 3 "TCY" "Tetracycline" "M45 Table 16" 1 2048 FALSE +"CLSI 2013" "MIC" "B_BRKHL_MALL" "Burkholderia mallei" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "TCY" "Tetracycline" "M45 Table 3" 4 16 FALSE +"CLSI 2013" "MIC" "B_CRDBC" "Cardiobacterium" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2013" "MIC" "B_EKNLL" "Eikenella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" "30ug" 19 14 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "TCY" "Tetracycline" "Table 2D" 4 16 FALSE +"CLSI 2013" "MIC" "B_FRNCS_TLRN_TLRN" "Francisella tularensis tularensis" 1 "TCY" "Tetracycline" "M45 Table 16" 4 2048 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TCY" "Tetracycline" "Table 2B-5" 4 16 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" "30ug" 29 25 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "TCY" "Tetracycline" "Table 2E" 2 8 FALSE +"CLSI 2013" "MIC" "B_KGLLA" "Kingella" 3 "TCY" "Tetracycline" "M45 Table 7" 2 8 FALSE +"CLSI 2013" "DISK" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" "30ug" 29 24 FALSE +"CLSI 2013" "MIC" "B_MRXLL_CTRR" "Moraxella catarrhalis" 2 "TCY" "Tetracycline" "M45 Table 12" 2 8 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" "30ug" 38 30 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TCY" "Tetracycline" "Table 2F" 0.25 2 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" "30ug" 15 11 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "TCY" "Tetracycline" "M45 Table 2" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" "30ug" 23 23 FALSE +"CLSI 2013" "MIC" "B_PSTRL" "Pasteurella" 3 "TCY" "Tetracycline" "M45 Table 13" 1 2048 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" "30ug" 19 14 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "TCY" "Tetracycline" "Table 2C" 4 16 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" "30ug" 23 18 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "TCY" "Tetracycline" "Table 2H-1" 2 8 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" "30ug" 28 24 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TCY" "Tetracycline" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" "30ug" 23 18 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TCY" "Tetracycline" "Table 2H-2" 2 8 FALSE +"CLSI 2013" "MIC" "B_YERSN_PSTS" "Yersinia pestis" 2 "TCY" "Tetracycline" "M45 Table 16" 4 16 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" "30ug" 14 10 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "TEC" "Teicoplanin" "Table 2D" 8 32 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" "30ug" 14 10 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "TEC" "Teicoplanin" "Table 2C" 8 32 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "TIC" "Ticarcillin" "Table 2B-2" "75ug" 20 14 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "TIC" "Ticarcillin" "Table 2B-2" 16 128 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TIC" "Ticarcillin" "Table 2J" 32 128 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TIC" "Ticarcillin" "Table 2B-5" 16 128 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TIC" "Ticarcillin" "Table 2B-1" "75ug" 24 15 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TIC" "Ticarcillin" "Table 2B-1" 16 128 FALSE +"CLSI 2013" "DISK" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2013" "MIC" "B_ACTNB_PLRP" "Actinobacillus pleuropneumoniae" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2013" "DISK" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" "15ug" 11 10 FALSE +"CLSI 2013" "MIC" "B_PSTRL_MLTC" "Pasteurella multocida" 2 "TIL" "Tilmicosin" "Vet Table" 16 32 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" "15ug" 15 11 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "TLT" "Telithromycin" "Table 2E" 4 16 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" "15ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TLT" "Telithromycin" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" "5ug" 16 10 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "TMP" "Trimethoprim" "Table 2C" 8 16 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" "10ug" 15 12 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "TOB" "Tobramycin" "Table 2B-2" 4 16 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TOB" "Tobramycin" "Table 2B-5" 4 16 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" "10ug" 15 12 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TOB" "Tobramycin" "Table 2B-1" 4 16 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" "10ug" 22 22 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "TVA" "Trovafloxacin" "Table 2E" 1 2048 FALSE +"CLSI 2013" "DISK" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" "10ug" 34 34 FALSE +"CLSI 2013" "MIC" "B_NESSR_GNRR" "Neisseria gonorrhoeae" 2 "TVA" "Trovafloxacin" "Table 2F" 0.25 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" "10ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "TVA" "Trovafloxacin" "Table 2H-1" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" "10ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "TVA" "Trovafloxacin" "Table 2G" 1 4 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" "10ug" 19 15 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "TVA" "Trovafloxacin" "Table 2H-2" 1 4 FALSE +"CLSI 2013" "DISK" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" "100ug/10ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_ACNTB" "Acinetobacter" 3 "TZP" "Piperacillin/tazobactam" "Table 2B-2" 16 128 FALSE +"CLSI 2013" "DISK" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_AERMN" "Aeromonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2013" "MIC" "B_ANAER" "(unknown anaerobic bacteria)" 6 "TZP" "Piperacillin/tazobactam" "Table 2J" 32 128 FALSE +"CLSI 2013" "MIC" "B_GRAMN" "(unknown Gram-negatives)" 6 "TZP" "Piperacillin/tazobactam" "Table 2B-5" 16 128 FALSE +"CLSI 2013" "DISK" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" "100ug/10ug" 21 21 FALSE +"CLSI 2013" "MIC" "B_HMPHL" "Haemophilus" 3 "TZP" "Piperacillin/tazobactam" "Table 2E" 1 2 FALSE +"CLSI 2013" "DISK" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" "100ug/10ug" 21 17 FALSE +"CLSI 2013" "MIC" "B_PLSMN" "Plesiomonas" 3 "TZP" "Piperacillin/tazobactam" "M45 Table 2" 16 128 FALSE +"CLSI 2013" "DISK" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" "100ug/10ug" 21 14 FALSE +"CLSI 2013" "MIC" "B_PSDMN_AERG" "Pseudomonas aeruginosa" 2 "TZP" "Piperacillin/tazobactam" "Table 2B-1" 16 128 FALSE +"CLSI 2013" "MIC" "B_ABTRP" "Abiotrophia" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2013" "MIC" "B_BCLLS" "Bacillus" 3 "VAN" "Vancomycin" "M45 Table 3" 4 2048 FALSE +"CLSI 2013" "MIC" "B_CMPYL" "Campylobacter" 3 "VAN" "Vancomycin" "M45 Table 5" 2 2048 FALSE +"CLSI 2013" "DISK" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" "30ug" 17 14 FALSE +"CLSI 2013" "MIC" "B_ENTRC" "Enterococcus" 3 "VAN" "Vancomycin" "Table 2D" 4 32 FALSE +"CLSI 2013" "MIC" "B_GRNLC" "Granulicatella" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2013" "MIC" "B_LCTBC" "Lactobacillus" 3 "VAN" "Vancomycin" "M45 Table 9" 2 16 FALSE +"CLSI 2013" "MIC" "B_STPHY" "Staphylococcus" 3 "VAN" "Vancomycin" "Table 2C" 4 32 FALSE +"CLSI 2013" "MIC" "B_STPHY_AURS" "Staphylococcus aureus" 2 "VAN" "Vancomycin" "Table 2C" 2 16 FALSE +"CLSI 2013" "DISK" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "Table 2H-1" "30ug" 17 17 FALSE +"CLSI 2013" "MIC" "B_STRPT" "Streptococcus" 3 "VAN" "Vancomycin" "M45 Table 1" 1 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" "30ug" 17 17 FALSE +"CLSI 2013" "MIC" "B_STRPT_PNMN" "Streptococcus pneumoniae" 2 "VAN" "Vancomycin" "Table 2G" 1 2048 FALSE +"CLSI 2013" "DISK" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" "30ug" 17 17 FALSE +"CLSI 2013" "MIC" "B_STRPT_VIRI" "Viridans Group Streptococcus (VGS)" 2 "VAN" "Vancomycin" "Table 2H-2" 1 2048 FALSE diff --git a/data-raw/clinical_breakpoints.xlsx b/data-raw/clinical_breakpoints.xlsx new file mode 100644 index 000000000..f9214fc36 Binary files /dev/null and b/data-raw/clinical_breakpoints.xlsx differ diff --git a/inst/tinytest/test-first_isolate.R b/inst/tinytest/test-first_isolate.R index 67c43c28f..7cc03773b 100755 --- a/inst/tinytest/test-first_isolate.R +++ b/inst/tinytest/test-first_isolate.R @@ -214,7 +214,7 @@ expect_equal( 1108 ) -# empty rsi results +# empty sir results expect_equal( sum(first_isolate(example_isolates, include_untested_sir = FALSE)), 1366 diff --git a/inst/tinytest/test-rsi.R b/inst/tinytest/test-rsi.R index b668a8e4d..d7181e234 100644 --- a/inst/tinytest/test-rsi.R +++ b/inst/tinytest/test-rsi.R @@ -69,7 +69,7 @@ expect_error(as.sir.mic(as.mic(16))) expect_error(as.sir.disk(as.disk(16))) expect_error(get_guideline("this one does not exist")) if (AMR:::pkg_is_available("dplyr", min_version = "1.0.0")) { - # 40 rsi columns + # 40 sir columns expect_equal( example_isolates %>% mutate_at(vars(PEN:RIF), as.character) %>% @@ -218,7 +218,7 @@ expect_inherits( expect_inherits( suppressWarnings(as.sir(data.frame( mo = "Escherichia coli", - amoxi = c("R", "S", "I", "invalid") + amoxi = c("S", "I", "R", "invalid") ))$amoxi), "sir" ) diff --git a/inst/tinytest/test-vctrs.R b/inst/tinytest/test-vctrs.R index 8a89746a2..76c5de43d 100755 --- a/inst/tinytest/test-vctrs.R +++ b/inst/tinytest/test-vctrs.R @@ -33,7 +33,7 @@ if (AMR:::pkg_is_available("dplyr", also_load = FALSE)) { mo = as.mo("Escherichia coli"), mic = as.mic(2), disk = as.disk(20), - rsi = as.sir("S")) + sir = as.sir("S")) check1 <- lapply(test, class) test[1, "ab"] <- "GEN" test[1, "mo"] <- "B_KLBSL_PNMN" diff --git a/man/as.sir.Rd b/man/as.sir.Rd index e1aabbe18..517a69a7c 100644 --- a/man/as.sir.Rd +++ b/man/as.sir.Rd @@ -11,7 +11,7 @@ \alias{as.sir.disk} \alias{as.sir.data.frame} \alias{sir_interpretation_history} -\title{Interpret MIC and Disk Values, or Clean Raw SIR Data} +\title{Translate MIC and Disk Diffusion to SIR, or Clean Existing SIR Data} \format{ An object of class \code{sir} (inherits from \code{ordered}, \code{factor}) of length 1. } diff --git a/man/mean_amr_distance.Rd b/man/mean_amr_distance.Rd index 9478424cc..68059981a 100755 --- a/man/mean_amr_distance.Rd +++ b/man/mean_amr_distance.Rd @@ -16,7 +16,7 @@ mean_amr_distance(x, ...) amr_distance_from_row(amr_distance, row) } \arguments{ -\item{x}{a vector of class \link[=as.sir]{rsi}, \link[=as.mic]{mic} or \link[=as.disk]{disk}, or a \link{data.frame} containing columns of any of these classes} +\item{x}{a vector of class \link[=as.sir]{sir}, \link[=as.mic]{mic} or \link[=as.disk]{disk}, or a \link{data.frame} containing columns of any of these classes} \item{...}{variables to select (supports \link[tidyselect:language]{tidyselect language} such as \code{column1:column4} and \code{where(is.mic)}, and can thus also be \link[=ab_selector]{antibiotic selectors}} @@ -46,9 +46,9 @@ Isolates with distances less than 0.01 difference from each other should be cons } \examples{ -rsi <- random_sir(10) -rsi -mean_amr_distance(rsi) +sir <- random_sir(10) +sir +mean_amr_distance(sir) mic <- random_mic(10) mic diff --git a/man/proportion.Rd b/man/proportion.Rd index 8a8c0f283..844ee4ee4 100755 --- a/man/proportion.Rd +++ b/man/proportion.Rd @@ -71,7 +71,7 @@ sir_sf( \item{only_all_tested}{(for combination therapies, i.e. using more than one variable for \code{...}): a \link{logical} to indicate that isolates must be tested for all antibiotics, see section \emph{Combination Therapy} below} -\item{ab_result}{antibiotic results to test against, must be one of more values of "R", "S", "I"} +\item{ab_result}{antibiotic results to test against, must be one or more values of "S", "I", or "R"} \item{confidence_level}{the confidence level for the returned confidence interval. For the calculation, the number of S or SI isolates, and R isolates are compared with the total number of available isolates with R, S, or I by using \code{\link[=binom.test]{binom.test()}}, i.e., the Clopper-Pearson method.} @@ -264,7 +264,7 @@ if (require("dplyr")) { combination_n = count_all(CIP, GEN) ) - # Get proportions S/I/R immediately of all rsi columns + # Get proportions S/I/R immediately of all sir columns example_isolates \%>\% select(AMX, CIP) \%>\% proportion_df(translate = FALSE) diff --git a/vignettes/AMR.Rmd b/vignettes/AMR.Rmd index 962a53b7d..25da5af9a 100755 --- a/vignettes/AMR.Rmd +++ b/vignettes/AMR.Rmd @@ -33,7 +33,7 @@ Conducting AMR data analysis unfortunately requires in-depth knowledge from diff * Good questions (always start with those!) * A thorough understanding of (clinical) epidemiology, to understand the clinical and epidemiological relevance and possible bias of results * A thorough understanding of (clinical) microbiology/infectious diseases, to understand which microorganisms are causal to which infections and the implications of pharmaceutical treatment, as well as understanding intrinsic and acquired microbial resistance -* Experience with data analysis with microbiological tests and their results, to understand the determination and limitations of MIC values and their interpretations to RSI values +* Experience with data analysis with microbiological tests and their results, to understand the determination and limitations of MIC values and their interpretations to SIR values * Availability of the biological taxonomy of microorganisms and probably normalisation factors for pharmaceuticals, such as defined daily doses (DDD) * Available (inter-)national guidelines, and profound methods to apply them