Compare commits
3 Commits
5b5f70a103
...
f90e27c1b0
Author | SHA1 | Date | |
---|---|---|---|
f90e27c1b0 | |||
1e66a3daf3 | |||
56f1ce328a |
10
.github/workflows/check.yaml
vendored
@ -59,8 +59,8 @@ jobs:
|
||||
- {os: macOS-latest, r: '3.4', allowfail: false}
|
||||
- {os: macOS-latest, r: '3.3', allowfail: false}
|
||||
- {os: macOS-latest, r: '3.2', allowfail: false}
|
||||
- {os: macOS-latest, r: '3.1', allowfail: true}
|
||||
- {os: macOS-latest, r: '3.0', allowfail: true}
|
||||
# - {os: macOS-latest, r: '3.1', allowfail: true}
|
||||
# - {os: macOS-latest, r: '3.0', allowfail: true}
|
||||
- {os: ubuntu-20.04, r: 'devel', allowfail: true, rspm: "https://packagemanager.rstudio.com/cran/__linux__/focal/latest"}
|
||||
- {os: ubuntu-20.04, r: '4.1', allowfail: false, rspm: "https://packagemanager.rstudio.com/cran/__linux__/focal/latest"}
|
||||
- {os: ubuntu-20.04, r: '4.0', allowfail: false, rspm: "https://packagemanager.rstudio.com/cran/__linux__/focal/latest"}
|
||||
@ -78,9 +78,9 @@ jobs:
|
||||
- {os: windows-latest, r: '3.5', allowfail: false}
|
||||
- {os: windows-latest, r: '3.4', allowfail: false}
|
||||
- {os: windows-latest, r: '3.3', allowfail: false}
|
||||
- {os: windows-latest, r: '3.2', allowfail: true}
|
||||
- {os: windows-latest, r: '3.1', allowfail: true}
|
||||
- {os: windows-latest, r: '3.0', allowfail: true}
|
||||
# - {os: windows-latest, r: '3.2', allowfail: true}
|
||||
# - {os: windows-latest, r: '3.1', allowfail: true}
|
||||
# - {os: windows-latest, r: '3.0', allowfail: true}
|
||||
env:
|
||||
R_REMOTES_NO_ERRORS_FROM_WARNINGS: true
|
||||
RSPM: ${{ matrix.config.rspm }}
|
||||
|
@ -1,6 +1,6 @@
|
||||
Package: AMR
|
||||
Version: 1.7.1.9066
|
||||
Date: 2021-12-11
|
||||
Version: 1.7.1.9069
|
||||
Date: 2021-12-12
|
||||
Title: Antimicrobial Resistance Data Analysis
|
||||
Description: Functions to simplify and standardise antimicrobial resistance (AMR)
|
||||
data analysis and to work with microbial and antimicrobial properties by
|
||||
|
@ -230,8 +230,8 @@ export(fluoroquinolones)
|
||||
export(full_join_microorganisms)
|
||||
export(g.test)
|
||||
export(geom_rsi)
|
||||
export(get_AMR_locale)
|
||||
export(get_episode)
|
||||
export(get_locale)
|
||||
export(get_mo_source)
|
||||
export(ggplot_pca)
|
||||
export(ggplot_rsi)
|
||||
|
14
NEWS.md
@ -1,14 +1,18 @@
|
||||
# `AMR` 1.7.1.9066
|
||||
## <small>Last updated: 11 December 2021</small>
|
||||
# `AMR` 1.7.1.9069
|
||||
## <small>Last updated: 12 December 2021</small>
|
||||
|
||||
All functions in this package are now all considered to be stable. Updates to the AMR interpretation rules (such as by EUCAST and CLSI), the microbial taxonomy, and the antibiotic dosages will all be updated every 6 to 12 months from now on.
|
||||
|
||||
### Breaking changes
|
||||
* Removed `p_symbol()` and all `filter_*()` functions (except for `filter_first_isolate()`), which were all deprecated in a previous package version
|
||||
* Removed the `key_antibiotics()` and `key_antibiotics_equal()` functions, which were deprecated and superseded by `key_antimicrobials()` and `antimicrobials_equal()`
|
||||
* Removed all previously implemented `ggplot2::ggplot()` generics for classes `<mic>`, `<disk>`, `<rsi>` and `<resistance_predict>` as they did not follow the `ggplot2` logic. They were replaced with `ggplot2::autoplot()` generics.
|
||||
* Renamed function `get_locale()` to `get_AMR_locale()` to prevent conflicts with other packages
|
||||
|
||||
### New
|
||||
* Support for the CLSI 2021 guideline for interpreting MIC/disk diffusion values, which are incorporated in the `rsi_translation` data set
|
||||
* Support for EUCAST Intrinsic Resistance and Unusual Phenotypes v3.3 (October 2021). This is now the default EUCAST guideline in the package (all older guidelines are still available) for `eucast_rules()`, `mo_intrinsic_resistant()` and `mdro()`. The `intrinsic_resistant` data set was also updated accordingly.
|
||||
* Support for Danish, and also added missing translations of all antimicrobial drugs in Italian, French and Portuguese
|
||||
* Support for all antimicrobial drug (group) names and colloquial microorganism names in Danish, Dutch, English, French, German, Italian, Portuguese, Russian, Spanish and Swedish
|
||||
* Function `set_ab_names()` to rename data set columns that resemble antimicrobial drugs. This allows for quickly renaming columns to official names, ATC codes, etc. Its second argument can be a tidyverse way of selecting:
|
||||
```r
|
||||
example_isolates %>% set_ab_names(where(is.rsi))
|
||||
@ -50,7 +54,7 @@
|
||||
* When printing a tibble with any old MO code, a warning will be thrown that old codes should be updated using `as.mo()`
|
||||
* Improved automatic column selector when `col_*` arguments are left blank, e.g. in `first_isolate()`
|
||||
* The right input types for `random_mic()`, `random_disk()` and `random_rsi()` are now enforced
|
||||
* `as.rsi()` has an improved algorithm and can now also correct for textual input (such as "Susceptible", "Resistant") in Danish, Dutch, English, French, German, Italian, Portuguese and Spanish
|
||||
* `as.rsi()` has an improved algorithm and can now also correct for textual input (such as "Susceptible", "Resistant") in all supported languages
|
||||
* `as.mic()` has an improved algorithm
|
||||
* When warnings are thrown because of too few isolates in any `count_*()`, `proportion_*()` function (or `resistant()` or `susceptible()`), the `dplyr` group will be shown, if available
|
||||
* Fix for legends created with `scale_rsi_colours()` when using `ggplot2` v3.3.4 or higher (this is ggplot2 bug 4511, soon to be fixed)
|
||||
@ -68,7 +72,7 @@
|
||||
* `get_episode()` and `is_new_episode()` can now cope with `NA`s
|
||||
|
||||
### Other
|
||||
* This package is now being maintained by two epidemiologists and a data scientist from two different non-profit healthcare organisations. All functions in this package are now all considered to be stable. Updates to the AMR interpretation rules (such as by EUCAST and CLSI), the microbial taxonomy, and the antibiotic dosages will all be updated every 6 to 12 months from now on.
|
||||
* This package is now being maintained by two epidemiologists and a data scientist from two different non-profit healthcare organisations.
|
||||
|
||||
|
||||
# AMR 1.7.1
|
||||
|
@ -30,7 +30,7 @@
|
||||
#' @param x any (vector of) text that can be coerced to a valid antibiotic code with [as.ab()]
|
||||
#' @param tolower a [logical] to indicate whether the first [character] of every output should be transformed to a lower case [character]. This will lead to e.g. "polymyxin B" and not "polymyxin b".
|
||||
#' @param property one of the column names of one of the [antibiotics] data set: `vector_or(colnames(antibiotics), sort = FALSE)`.
|
||||
#' @param language language of the returned text, defaults to system language (see [get_locale()]) and can also be set with `getOption("AMR_locale")`. Use `language = NULL` or `language = ""` to prevent translation.
|
||||
#' @param language language of the returned text, defaults to system language (see [get_AMR_locale()]) and can also be set with `getOption("AMR_locale")`. Use `language = NULL` or `language = ""` to prevent translation.
|
||||
#' @param administration way of administration, either `"oral"` or `"iv"`
|
||||
#' @param open browse the URL using [utils::browseURL()]
|
||||
#' @param ... in case of [set_ab_names()] and `data` is a [data.frame]: variables to select (supports tidy selection such as `column1:column4`), otherwise other arguments passed on to [as.ab()]
|
||||
@ -120,7 +120,7 @@
|
||||
#' colnames()
|
||||
#' }
|
||||
#' }
|
||||
ab_name <- function(x, language = get_locale(), tolower = FALSE, ...) {
|
||||
ab_name <- function(x, language = get_AMR_locale(), tolower = FALSE, ...) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(language, has_length = 1, is_in = c(LANGUAGES_SUPPORTED, ""), allow_NULL = TRUE, allow_NA = TRUE)
|
||||
meet_criteria(tolower, allow_class = "logical", has_length = 1)
|
||||
@ -163,7 +163,7 @@ ab_tradenames <- function(x, ...) {
|
||||
|
||||
#' @rdname ab_property
|
||||
#' @export
|
||||
ab_group <- function(x, language = get_locale(), ...) {
|
||||
ab_group <- function(x, language = get_AMR_locale(), ...) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(language, has_length = 1, is_in = c(LANGUAGES_SUPPORTED, ""), allow_NULL = TRUE, allow_NA = TRUE)
|
||||
translate_AMR(ab_validate(x = x, property = "group", ...), language = language, only_affect_ab_names = TRUE)
|
||||
@ -201,7 +201,7 @@ ab_atc <- function(x, only_first = FALSE, ...) {
|
||||
|
||||
#' @rdname ab_property
|
||||
#' @export
|
||||
ab_atc_group1 <- function(x, language = get_locale(), ...) {
|
||||
ab_atc_group1 <- function(x, language = get_AMR_locale(), ...) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(language, has_length = 1, is_in = c(LANGUAGES_SUPPORTED, ""), allow_NULL = TRUE, allow_NA = TRUE)
|
||||
translate_AMR(ab_validate(x = x, property = "atc_group1", ...), language = language, only_affect_ab_names = TRUE)
|
||||
@ -209,7 +209,7 @@ ab_atc_group1 <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname ab_property
|
||||
#' @export
|
||||
ab_atc_group2 <- function(x, language = get_locale(), ...) {
|
||||
ab_atc_group2 <- function(x, language = get_AMR_locale(), ...) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(language, has_length = 1, is_in = c(LANGUAGES_SUPPORTED, ""), allow_NULL = TRUE, allow_NA = TRUE)
|
||||
translate_AMR(ab_validate(x = x, property = "atc_group2", ...), language = language, only_affect_ab_names = TRUE)
|
||||
@ -276,7 +276,7 @@ ab_ddd_units <- function(x, administration = "oral", ...) {
|
||||
|
||||
#' @rdname ab_property
|
||||
#' @export
|
||||
ab_info <- function(x, language = get_locale(), ...) {
|
||||
ab_info <- function(x, language = get_AMR_locale(), ...) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(language, has_length = 1, is_in = c(LANGUAGES_SUPPORTED, ""), allow_NULL = TRUE, allow_NA = TRUE)
|
||||
|
||||
@ -327,7 +327,7 @@ ab_url <- function(x, open = FALSE, ...) {
|
||||
|
||||
#' @rdname ab_property
|
||||
#' @export
|
||||
ab_property <- function(x, property = "name", language = get_locale(), ...) {
|
||||
ab_property <- function(x, property = "name", language = get_AMR_locale(), ...) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(property, is_in = colnames(antibiotics), has_length = 1)
|
||||
meet_criteria(language, is_in = c(LANGUAGES_SUPPORTED, ""), has_length = 1, allow_NULL = TRUE, allow_NA = TRUE)
|
||||
@ -337,7 +337,7 @@ ab_property <- function(x, property = "name", language = get_locale(), ...) {
|
||||
#' @rdname ab_property
|
||||
#' @aliases ATC
|
||||
#' @export
|
||||
set_ab_names <- function(data, ..., property = "name", language = get_locale(), snake_case = NULL) {
|
||||
set_ab_names <- function(data, ..., property = "name", language = get_AMR_locale(), snake_case = NULL) {
|
||||
meet_criteria(data, allow_class = c("data.frame", "character"))
|
||||
meet_criteria(property, is_in = colnames(antibiotics), has_length = 1, ignore.case = TRUE)
|
||||
meet_criteria(language, has_length = 1, is_in = c(LANGUAGES_SUPPORTED, ""), allow_NULL = TRUE, allow_NA = TRUE)
|
||||
|
@ -162,7 +162,7 @@ bug_drug_combinations <- function(x,
|
||||
#' @rdname bug_drug_combinations
|
||||
format.bug_drug_combinations <- function(x,
|
||||
translate_ab = "name (ab, atc)",
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
minimum = 30,
|
||||
combine_SI = TRUE,
|
||||
combine_IR = FALSE,
|
||||
|
@ -213,7 +213,7 @@ n_rsi <- count_all
|
||||
#' @export
|
||||
count_df <- function(data,
|
||||
translate_ab = "name",
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
combine_SI = TRUE,
|
||||
combine_IR = FALSE) {
|
||||
tryCatch(
|
||||
|
@ -490,8 +490,6 @@ first_isolate <- function(x = NULL,
|
||||
FALSE)
|
||||
} else {
|
||||
# no key antibiotics
|
||||
x1 <<- x$other_pat_or_mo
|
||||
x2 <<- x$more_than_episode_ago
|
||||
x$newvar_first_isolate <- pm_if_else(x$newvar_row_index_sorted >= row.start &
|
||||
x$newvar_row_index_sorted <= row.end &
|
||||
x$newvar_genus_species != "" &
|
||||
|
@ -158,7 +158,7 @@ ggplot_rsi <- function(data,
|
||||
combine_SI = TRUE,
|
||||
combine_IR = FALSE,
|
||||
minimum = 30,
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
nrow = NULL,
|
||||
colours = c(S = "#3CAEA3",
|
||||
SI = "#3CAEA3",
|
||||
@ -269,7 +269,7 @@ geom_rsi <- function(position = NULL,
|
||||
fill = "interpretation",
|
||||
translate_ab = "name",
|
||||
minimum = 30,
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
combine_SI = TRUE,
|
||||
combine_IR = FALSE,
|
||||
...) {
|
||||
@ -438,7 +438,7 @@ labels_rsi_count <- function(position = NULL,
|
||||
x = "antibiotic",
|
||||
translate_ab = "name",
|
||||
minimum = 30,
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
combine_SI = TRUE,
|
||||
combine_IR = FALSE,
|
||||
datalabels.size = 3,
|
||||
|
8
R/like.R
@ -124,31 +124,23 @@ like <- function(x, pattern, ignore.case = TRUE) {
|
||||
#' @rdname like
|
||||
#' @export
|
||||
"%like%" <- function(x, pattern) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(pattern, allow_NA = FALSE)
|
||||
like(x, pattern, ignore.case = TRUE)
|
||||
}
|
||||
|
||||
#' @rdname like
|
||||
#' @export
|
||||
"%unlike%" <- function(x, pattern) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(pattern, allow_NA = FALSE)
|
||||
!like(x, pattern, ignore.case = TRUE)
|
||||
}
|
||||
|
||||
#' @rdname like
|
||||
#' @export
|
||||
"%like_case%" <- function(x, pattern) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(pattern, allow_NA = FALSE)
|
||||
like(x, pattern, ignore.case = FALSE)
|
||||
}
|
||||
|
||||
#' @rdname like
|
||||
#' @export
|
||||
"%unlike_case%" <- function(x, pattern) {
|
||||
meet_criteria(x, allow_NA = TRUE)
|
||||
meet_criteria(pattern, allow_NA = FALSE)
|
||||
!like(x, pattern, ignore.case = FALSE)
|
||||
}
|
||||
|
12
R/mo.R
@ -37,7 +37,7 @@
|
||||
#' @param allow_uncertain a number between `0` (or `"none"`) and `3` (or `"all"`), or `TRUE` (= `2`) or `FALSE` (= `0`) to indicate whether the input should be checked for less probable results, see *Details*
|
||||
#' @param reference_df a [data.frame] to be used for extra reference when translating `x` to a valid [`mo`]. See [set_mo_source()] and [get_mo_source()] to automate the usage of your own codes (e.g. used in your analysis or organisation).
|
||||
#' @param ignore_pattern a regular expression (case-insensitive) of which all matches in `x` must return `NA`. This can be convenient to exclude known non-relevant input and can also be set with the option `AMR_ignore_pattern`, e.g. `options(AMR_ignore_pattern = "(not reported|contaminated flora)")`.
|
||||
#' @param language language to translate text like "no growth", which defaults to the system language (see [get_locale()])
|
||||
#' @param language language to translate text like "no growth", which defaults to the system language (see [get_AMR_locale()])
|
||||
#' @param info a [logical] to indicate if a progress bar should be printed if more than 25 items are to be coerced, defaults to `TRUE` only in interactive mode
|
||||
#' @param ... other arguments passed on to functions
|
||||
#' @rdname as.mo
|
||||
@ -161,7 +161,7 @@ as.mo <- function(x,
|
||||
allow_uncertain = TRUE,
|
||||
reference_df = get_mo_source(),
|
||||
ignore_pattern = getOption("AMR_ignore_pattern"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
info = interactive(),
|
||||
...) {
|
||||
meet_criteria(x, allow_class = c("mo", "data.frame", "list", "character", "numeric", "integer", "factor"), allow_NA = TRUE)
|
||||
@ -267,7 +267,7 @@ exec_as.mo <- function(x,
|
||||
reference_data_to_use = MO_lookup,
|
||||
actual_uncertainty = 1,
|
||||
actual_input = NULL,
|
||||
language = get_locale()) {
|
||||
language = get_AMR_locale()) {
|
||||
meet_criteria(x, allow_class = c("mo", "data.frame", "list", "character", "numeric", "integer", "factor"), allow_NA = TRUE)
|
||||
meet_criteria(Becker, allow_class = c("logical", "character"), has_length = 1)
|
||||
meet_criteria(Lancefield, allow_class = c("logical", "character"), has_length = 1)
|
||||
@ -1482,9 +1482,9 @@ exec_as.mo <- function(x,
|
||||
uncertainties <- as.list(pm_distinct(uncertainties, input, .keep_all = TRUE))
|
||||
pkg_env$mo_uncertainties <- uncertainties
|
||||
if (message_not_thrown_before("as.mo", "uncertainties", uncertainties$input)) {
|
||||
plural <- c("", "this", "uncertainty")
|
||||
plural <- c("", "this")
|
||||
if (length(uncertainties$input) > 1) {
|
||||
plural <- c("s", "these", "uncertainties")
|
||||
plural <- c("s", "these uncertainties")
|
||||
}
|
||||
if (length(uncertainties$input) <= 3) {
|
||||
examples <- vector_and(paste0('"', uncertainties$input,
|
||||
@ -1494,7 +1494,7 @@ exec_as.mo <- function(x,
|
||||
examples <- paste0(nr2char(length(uncertainties$input)), " microorganism", plural[1])
|
||||
}
|
||||
msg <- paste0("Function `as.mo()` is uncertain about ", examples,
|
||||
". Run `mo_uncertainties()` to review ", plural[2], " ", plural[3], ".")
|
||||
". Run `mo_uncertainties()` to review ", plural[2], ".")
|
||||
message_(msg)
|
||||
}
|
||||
}
|
||||
|
@ -29,7 +29,7 @@
|
||||
#' @inheritSection lifecycle Stable Lifecycle
|
||||
#' @param x any [character] (vector) that can be coerced to a valid microorganism code with [as.mo()]. Can be left blank for auto-guessing the column containing microorganism codes if used in a data set, see *Examples*.
|
||||
#' @param property one of the column names of the [microorganisms] data set: `r vector_or(colnames(microorganisms), sort = FALSE, quotes = TRUE)`, or must be `"shortname"`
|
||||
#' @param language language of the returned text, defaults to system language (see [get_locale()]) and can be overwritten by setting the option `AMR_locale`, e.g. `options(AMR_locale = "de")`, see [translate]. Also used to translate text like "no growth". Use `language = NULL` or `language = ""` to prevent translation.
|
||||
#' @param language language of the returned text, defaults to system language (see [get_AMR_locale()]) and can be overwritten by setting the option `AMR_locale`, e.g. `options(AMR_locale = "de")`, see [translate]. Also used to translate text like "no growth". Use `language = NULL` or `language = ""` to prevent translation.
|
||||
#' @param ... other arguments passed on to [as.mo()], such as 'allow_uncertain' and 'ignore_pattern'
|
||||
#' @param ab any (vector of) text that can be coerced to a valid antibiotic code with [as.ab()]
|
||||
#' @param open browse the URL using [`browseURL()`][utils::browseURL()]
|
||||
@ -170,7 +170,7 @@
|
||||
#' mo_info("E. coli")
|
||||
#' }
|
||||
#' }
|
||||
mo_name <- function(x, language = get_locale(), ...) {
|
||||
mo_name <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_name")
|
||||
@ -190,7 +190,7 @@ mo_fullname <- mo_name
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_shortname <- function(x, language = get_locale(), ...) {
|
||||
mo_shortname <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_shortname")
|
||||
@ -230,7 +230,7 @@ mo_shortname <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_subspecies <- function(x, language = get_locale(), ...) {
|
||||
mo_subspecies <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_subspecies")
|
||||
@ -243,7 +243,7 @@ mo_subspecies <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_species <- function(x, language = get_locale(), ...) {
|
||||
mo_species <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_species")
|
||||
@ -256,7 +256,7 @@ mo_species <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_genus <- function(x, language = get_locale(), ...) {
|
||||
mo_genus <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_genus")
|
||||
@ -269,7 +269,7 @@ mo_genus <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_family <- function(x, language = get_locale(), ...) {
|
||||
mo_family <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_family")
|
||||
@ -282,7 +282,7 @@ mo_family <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_order <- function(x, language = get_locale(), ...) {
|
||||
mo_order <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_order")
|
||||
@ -295,7 +295,7 @@ mo_order <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_class <- function(x, language = get_locale(), ...) {
|
||||
mo_class <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_class")
|
||||
@ -308,7 +308,7 @@ mo_class <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_phylum <- function(x, language = get_locale(), ...) {
|
||||
mo_phylum <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_phylum")
|
||||
@ -321,7 +321,7 @@ mo_phylum <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_kingdom <- function(x, language = get_locale(), ...) {
|
||||
mo_kingdom <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_kingdom")
|
||||
@ -338,7 +338,7 @@ mo_domain <- mo_kingdom
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_type <- function(x, language = get_locale(), ...) {
|
||||
mo_type <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_type")
|
||||
@ -354,7 +354,7 @@ mo_type <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_gramstain <- function(x, language = get_locale(), ...) {
|
||||
mo_gramstain <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_gramstain")
|
||||
@ -385,7 +385,7 @@ mo_gramstain <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_is_gram_negative <- function(x, language = get_locale(), ...) {
|
||||
mo_is_gram_negative <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_is_gram_negative")
|
||||
@ -404,7 +404,7 @@ mo_is_gram_negative <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_is_gram_positive <- function(x, language = get_locale(), ...) {
|
||||
mo_is_gram_positive <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_is_gram_positive")
|
||||
@ -423,7 +423,7 @@ mo_is_gram_positive <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_is_yeast <- function(x, language = get_locale(), ...) {
|
||||
mo_is_yeast <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_is_yeast")
|
||||
@ -449,7 +449,7 @@ mo_is_yeast <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_is_intrinsic_resistant <- function(x, ab, language = get_locale(), ...) {
|
||||
mo_is_intrinsic_resistant <- function(x, ab, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_is_intrinsic_resistant")
|
||||
@ -483,7 +483,7 @@ mo_is_intrinsic_resistant <- function(x, ab, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_snomed <- function(x, language = get_locale(), ...) {
|
||||
mo_snomed <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_snomed")
|
||||
@ -496,7 +496,7 @@ mo_snomed <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_ref <- function(x, language = get_locale(), ...) {
|
||||
mo_ref <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_ref")
|
||||
@ -509,7 +509,7 @@ mo_ref <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_authors <- function(x, language = get_locale(), ...) {
|
||||
mo_authors <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_authors")
|
||||
@ -525,7 +525,7 @@ mo_authors <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_year <- function(x, language = get_locale(), ...) {
|
||||
mo_year <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_year")
|
||||
@ -541,7 +541,7 @@ mo_year <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_lpsn <- function(x, language = get_locale(), ...) {
|
||||
mo_lpsn <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_rank")
|
||||
@ -554,7 +554,7 @@ mo_lpsn <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_rank <- function(x, language = get_locale(), ...) {
|
||||
mo_rank <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_rank")
|
||||
@ -567,7 +567,7 @@ mo_rank <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_taxonomy <- function(x, language = get_locale(), ...) {
|
||||
mo_taxonomy <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_taxonomy")
|
||||
@ -593,7 +593,7 @@ mo_taxonomy <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_synonyms <- function(x, language = get_locale(), ...) {
|
||||
mo_synonyms <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_synonyms")
|
||||
@ -626,7 +626,7 @@ mo_synonyms <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_info <- function(x, language = get_locale(), ...) {
|
||||
mo_info <- function(x, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_info")
|
||||
@ -657,7 +657,7 @@ mo_info <- function(x, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_url <- function(x, open = FALSE, language = get_locale(), ...) {
|
||||
mo_url <- function(x, open = FALSE, language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_url")
|
||||
@ -696,7 +696,7 @@ mo_url <- function(x, open = FALSE, language = get_locale(), ...) {
|
||||
|
||||
#' @rdname mo_property
|
||||
#' @export
|
||||
mo_property <- function(x, property = "fullname", language = get_locale(), ...) {
|
||||
mo_property <- function(x, property = "fullname", language = get_AMR_locale(), ...) {
|
||||
if (missing(x)) {
|
||||
# this tries to find the data and an <mo> column
|
||||
x <- find_mo_col(fn = "mo_property")
|
||||
|
18
R/plot.R
@ -35,7 +35,7 @@
|
||||
#' @param main,title title of the plot
|
||||
#' @param xlab,ylab axis title
|
||||
#' @param colours_RSI colours to use for filling in the bars, must be a vector of three values (in the order R, S and I). The default colours are colour-blind friendly.
|
||||
#' @param language language to be used to translate 'Susceptible', 'Increased exposure'/'Intermediate' and 'Resistant', defaults to system language (see [get_locale()]) and can be overwritten by setting the option `AMR_locale`, e.g. `options(AMR_locale = "de")`, see [translate]. Use `language = NULL` or `language = ""` to prevent translation.
|
||||
#' @param language language to be used to translate 'Susceptible', 'Increased exposure'/'Intermediate' and 'Resistant', defaults to system language (see [get_AMR_locale()]) and can be overwritten by setting the option `AMR_locale`, e.g. `options(AMR_locale = "de")`, see [translate]. Use `language = NULL` or `language = ""` to prevent translation.
|
||||
#' @param expand a [logical] to indicate whether the range on the x axis should be expanded between the lowest and highest value. For MIC values, intermediate values will be factors of 2 starting from the highest MIC value. For disk diameters, the whole diameter range will be filled.
|
||||
#' @details
|
||||
#' The interpretation of "I" will be named "Increased exposure" for all EUCAST guidelines since 2019, and will be named "Intermediate" in all other cases.
|
||||
@ -83,7 +83,7 @@ plot.mic <- function(x,
|
||||
ylab = "Frequency",
|
||||
xlab = "Minimum Inhibitory Concentration (mg/L)",
|
||||
colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
expand = TRUE,
|
||||
...) {
|
||||
meet_criteria(mo, allow_class = c("mo", "character"), allow_NULL = TRUE)
|
||||
@ -169,7 +169,7 @@ barplot.mic <- function(height,
|
||||
ylab = "Frequency",
|
||||
xlab = "Minimum Inhibitory Concentration (mg/L)",
|
||||
colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
expand = TRUE,
|
||||
...) {
|
||||
meet_criteria(main, allow_class = "character", has_length = 1, allow_NULL = TRUE)
|
||||
@ -214,7 +214,7 @@ autoplot.mic <- function(object,
|
||||
ylab = "Frequency",
|
||||
xlab = "Minimum Inhibitory Concentration (mg/L)",
|
||||
colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
expand = TRUE,
|
||||
...) {
|
||||
stop_ifnot_installed("ggplot2")
|
||||
@ -305,7 +305,7 @@ plot.disk <- function(x,
|
||||
ab = NULL,
|
||||
guideline = "EUCAST",
|
||||
colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
expand = TRUE,
|
||||
...) {
|
||||
meet_criteria(main, allow_class = "character", has_length = 1, allow_NULL = TRUE)
|
||||
@ -392,7 +392,7 @@ barplot.disk <- function(height,
|
||||
ab = NULL,
|
||||
guideline = "EUCAST",
|
||||
colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
expand = TRUE,
|
||||
...) {
|
||||
meet_criteria(main, allow_class = "character", has_length = 1, allow_NULL = TRUE)
|
||||
@ -437,7 +437,7 @@ autoplot.disk <- function(object,
|
||||
xlab = "Disk diffusion diameter (mm)",
|
||||
guideline = "EUCAST",
|
||||
colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
expand = TRUE,
|
||||
...) {
|
||||
stop_ifnot_installed("ggplot2")
|
||||
@ -579,7 +579,7 @@ barplot.rsi <- function(height,
|
||||
xlab = "Antimicrobial Interpretation",
|
||||
ylab = "Frequency",
|
||||
colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
expand = TRUE,
|
||||
...) {
|
||||
meet_criteria(xlab, allow_class = "character", has_length = 1)
|
||||
@ -623,7 +623,7 @@ autoplot.rsi <- function(object,
|
||||
xlab = "Antimicrobial Interpretation",
|
||||
ylab = "Frequency",
|
||||
colours_RSI = c("#ED553B", "#3CAEA3", "#F6D55C"),
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
...) {
|
||||
stop_ifnot_installed("ggplot2")
|
||||
meet_criteria(title, allow_class = "character", allow_NULL = TRUE)
|
||||
|
@ -277,7 +277,7 @@ proportion_S <- function(...,
|
||||
#' @export
|
||||
proportion_df <- function(data,
|
||||
translate_ab = "name",
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
minimum = 30,
|
||||
as_percent = FALSE,
|
||||
combine_SI = TRUE,
|
||||
|
@ -202,7 +202,7 @@ rsi_calc <- function(...,
|
||||
rsi_calc_df <- function(type, # "proportion", "count" or "both"
|
||||
data,
|
||||
translate_ab = "name",
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
minimum = 30,
|
||||
as_percent = FALSE,
|
||||
combine_SI = TRUE,
|
||||
|
@ -27,7 +27,7 @@
|
||||
#' @export
|
||||
rsi_df <- function(data,
|
||||
translate_ab = "name",
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
minimum = 30,
|
||||
as_percent = FALSE,
|
||||
combine_SI = TRUE,
|
||||
|
BIN
R/sysdata.rda
@ -29,7 +29,7 @@
|
||||
#' @inheritSection lifecycle Stable Lifecycle
|
||||
#' @details Strings will be translated to foreign languages if they are defined in a local translation file. Additions to this file can be suggested at our repository. The file can be found here: <https://github.com/msberends/AMR/blob/main/data-raw/translations.tsv>. This file will be read by all functions where a translated output can be desired, like all [`mo_*`][mo_property()] functions (such as [mo_name()], [mo_gramstain()], [mo_type()], etc.) and [`ab_*`][ab_property()] functions (such as [ab_name()], [ab_group()], etc.).
|
||||
#'
|
||||
#' Currently supported languages are: `r vector_and(gsub(";.*", "", ISOcodes::ISO_639_2[which(ISOcodes::ISO_639_2$Alpha_2 %in% LANGUAGES_SUPPORTED), "Name"]), quotes = FALSE)`. All these languages have translations available for all antimicrobial agents and colloquial microorganism names.
|
||||
#' Currently supported languages are: `r vector_and(names(LANGUAGES_SUPPORTED), quotes = FALSE)`. All these languages have translations available for all antimicrobial agents and colloquial microorganism names.
|
||||
#'
|
||||
#' Please suggest your own translations [by creating a new issue on our repository](https://github.com/msberends/AMR/issues/new?title=Translations).
|
||||
#'
|
||||
@ -39,7 +39,7 @@
|
||||
#' 1. Setting the R option `AMR_locale`, e.g. by running `options(AMR_locale = "de")`
|
||||
#' 2. Setting the system variable `LANGUAGE` or `LANG`, e.g. by adding `LANGUAGE="de_DE.utf8"` to your `.Renviron` file in your home directory
|
||||
#'
|
||||
#' So if the R option `AMR_locale` is set, the system variables `LANGUAGE` and `LANG` will be ignored.
|
||||
#' Thus, if the R option `AMR_locale` is set, the system variables `LANGUAGE` and `LANG` will be ignored.
|
||||
#' @inheritSection AMR Read more on Our Website!
|
||||
#' @rdname translate
|
||||
#' @name translate
|
||||
@ -47,15 +47,15 @@
|
||||
#' @examples
|
||||
#' # The 'language' argument of below functions
|
||||
#' # will be set automatically to your system language
|
||||
#' # with get_locale()
|
||||
#' # with get_AMR_locale()
|
||||
#'
|
||||
#' # English
|
||||
#' mo_name("CoNS", language = "en")
|
||||
#' #> "Coagulase-negative Staphylococcus (CoNS)"
|
||||
#'
|
||||
#' # Danish
|
||||
#' mo_name("CoNS", language = "nl")
|
||||
#' #> "Koagulase-negative stafylokokker (CoNS)"
|
||||
#' mo_name("CoNS", language = "da")
|
||||
#' #> "Koagulase-negative stafylokokker (KNS)"
|
||||
#'
|
||||
#' # Dutch
|
||||
#' mo_name("CoNS", language = "nl")
|
||||
@ -76,7 +76,7 @@
|
||||
#' # Spanish
|
||||
#' mo_name("CoNS", language = "es")
|
||||
#' #> "Staphylococcus coagulasa negativo (SCN)"
|
||||
get_locale <- function() {
|
||||
get_AMR_locale <- function() {
|
||||
# AMR versions 1.3.0 and prior used the environmental variable:
|
||||
if (!identical("", Sys.getenv("AMR_locale"))) {
|
||||
options(AMR_locale = Sys.getenv("AMR_locale"))
|
||||
@ -88,10 +88,10 @@ get_locale <- function() {
|
||||
return(lang)
|
||||
} else {
|
||||
stop_("unsupported language set as option 'AMR_locale': \"", lang, "\" - use either ",
|
||||
vector_or(LANGUAGES_SUPPORTED, quotes = TRUE))
|
||||
vector_or(paste0('"', LANGUAGES_SUPPORTED, '" (', names(LANGUAGES_SUPPORTED), ")"), quotes = FALSE))
|
||||
}
|
||||
} else {
|
||||
# we now support the LANGUAGE system variable - return it if set
|
||||
# now check the LANGUAGE system variable - return it if set
|
||||
if (!identical("", Sys.getenv("LANGUAGE"))) {
|
||||
return(coerce_language_setting(Sys.getenv("LANGUAGE")))
|
||||
}
|
||||
@ -100,11 +100,22 @@ get_locale <- function() {
|
||||
}
|
||||
}
|
||||
|
||||
# fallback - automatic determination based on LC_COLLATE
|
||||
if (interactive() && message_not_thrown_before("get_AMR_locale", entire_session = TRUE)) {
|
||||
lang <- coerce_language_setting(Sys.getlocale("LC_COLLATE"))
|
||||
if (lang != "en") {
|
||||
message_("Assuming the ", names(LANGUAGES_SUPPORTED)[LANGUAGES_SUPPORTED == lang],
|
||||
" language for the AMR package. Change this with `options(AMR_locale = \"...\")` or see `?get_AMR_locale()`. ",
|
||||
"Supported languages are ", vector_and(names(LANGUAGES_SUPPORTED), quotes = FALSE),
|
||||
". This note will be shown once per session.")
|
||||
}
|
||||
return(lang)
|
||||
}
|
||||
coerce_language_setting(Sys.getlocale("LC_COLLATE"))
|
||||
}
|
||||
|
||||
coerce_language_setting <- function(lang) {
|
||||
# grepl() with ignore.case = FALSE is faster than %like%
|
||||
# grepl() with ignore.case = FALSE is 8x faster than %like_case%
|
||||
if (grepl("^(English|en_|EN_)", lang, ignore.case = FALSE, perl = TRUE)) {
|
||||
# as first option to optimise speed
|
||||
"en"
|
||||
@ -122,6 +133,10 @@ coerce_language_setting <- function(lang) {
|
||||
"fr"
|
||||
} else if (grepl("^(Portuguese|Portugu.+s|pt_|PT_)", lang, ignore.case = FALSE, perl = TRUE)) {
|
||||
"pt"
|
||||
} else if (grepl("^(Russian|pycc|ru_|RU_)", lang, ignore.case = FALSE, perl = TRUE)) {
|
||||
"ru"
|
||||
} else if (grepl("^(Swedish|Svenskt|sv_|SV_)", lang, ignore.case = FALSE, perl = TRUE)) {
|
||||
"sv"
|
||||
} else {
|
||||
# other language -> set to English
|
||||
"en"
|
||||
@ -130,7 +145,7 @@ coerce_language_setting <- function(lang) {
|
||||
|
||||
# translate strings based on inst/translations.tsv
|
||||
translate_AMR <- function(from,
|
||||
language = get_locale(),
|
||||
language = get_AMR_locale(),
|
||||
only_unknown = FALSE,
|
||||
only_affect_ab_names = FALSE,
|
||||
only_affect_mo_names = FALSE) {
|
||||
|
@ -6,7 +6,7 @@
|
||||
[![CodeFactor](https://www.codefactor.io/repository/github/msberends/amr/badge)](https://www.codefactor.io/repository/github/msberends/amr)
|
||||
[![Codecov](https://codecov.io/gh/msberends/AMR/branch/main/graph/badge.svg)](https://codecov.io/gh/msberends/AMR?branch=main)
|
||||
|
||||
<img src="https://msberends.github.io/AMR/works_great_on.png" align="center" height="150px" />
|
||||
<img src="https://msberends.github.io/AMR/AMR_intro.svg" align="center" height="300px" />
|
||||
|
||||
The latest built **source package** (`AMR_latest.tar.gz`) can be found in folder [/data-raw/](https://github.com/msberends/AMR/tree/main/data-raw).
|
||||
|
||||
|
@ -175,7 +175,7 @@ reference:
|
||||
- "`age_groups`"
|
||||
- "`age`"
|
||||
- "`availability`"
|
||||
- "`get_locale`"
|
||||
- "`get_AMR_locale`"
|
||||
- "`ggplot_pca`"
|
||||
- "`italicise_taxonomy`"
|
||||
- "`join`"
|
||||
|
7101
data-raw/AMR_intro.ai
Normal file
1102
data-raw/DRGLST.txt
14592
data-raw/DRGLST1.txt
@ -68,7 +68,16 @@ TRANSLATIONS <- utils::read.delim(file = "data-raw/translations.tsv",
|
||||
quote = "")
|
||||
|
||||
# for checking input in `language` argument in e.g. mo_*() and ab_*() functions
|
||||
LANGUAGES_SUPPORTED <- sort(c("en", colnames(TRANSLATIONS)[nchar(colnames(TRANSLATIONS)) == 2]))
|
||||
LANGUAGES_SUPPORTED <- c(Danish = "da",
|
||||
German = "de",
|
||||
English = "en",
|
||||
Spanish = "es",
|
||||
French = "fr",
|
||||
Italian = "it",
|
||||
Dutch = "nl",
|
||||
Portuguese = "pt",
|
||||
Russian = "ru",
|
||||
Swedish = "sv")
|
||||
|
||||
# EXAMPLE_ISOLATES <- readRDS("data-raw/example_isolates.rds")
|
||||
|
||||
|
6882
data-raw/logo.svg
Executable file → Normal file
Before Width: | Height: | Size: 222 KiB After Width: | Height: | Size: 164 KiB |
@ -1,3 +1,28 @@
|
||||
# ==================================================================== #
|
||||
# TITLE #
|
||||
# Antimicrobial Resistance (AMR) Data Analysis for R #
|
||||
# #
|
||||
# SOURCE #
|
||||
# https://github.com/msberends/AMR #
|
||||
# #
|
||||
# LICENCE #
|
||||
# (c) 2018-2021 Berends MS, Luz CF et al. #
|
||||
# Developed at the University of Groningen, the Netherlands, in #
|
||||
# collaboration with non-profit organisations Certe Medical #
|
||||
# Diagnostics & Advice, and University Medical Center Groningen. #
|
||||
# #
|
||||
# This R package is free software; you can freely use and distribute #
|
||||
# it for both personal and commercial purposes under the terms of the #
|
||||
# GNU General Public License version 2.0 (GNU GPL-2), as published by #
|
||||
# the Free Software Foundation. #
|
||||
# We created this package for both routine data analysis and academic #
|
||||
# research and it was publicly released in the hope that it will be #
|
||||
# useful, but it comes WITHOUT ANY WARRANTY OR LIABILITY. #
|
||||
# #
|
||||
# Visit our website for the full manual and a complete tutorial about #
|
||||
# how to conduct AMR data analysis: https://msberends.github.io/AMR/ #
|
||||
# ==================================================================== #
|
||||
|
||||
library(dplyr)
|
||||
library(readr)
|
||||
library(tidyr)
|
||||
@ -11,9 +36,10 @@ rsi_trans <- DRGLST1 %>%
|
||||
if (any(is.na(rsi_trans$BREAKPOINT_TYPE)) | !"Human" %in% rsi_trans$BREAKPOINT_TYPE) {
|
||||
stop("Check column BREAKPOINT_TYPE - something is WRONG!")
|
||||
}
|
||||
sort(unique(rsi_trans$GUIDELINES))
|
||||
rsi_trans <- rsi_trans %>%
|
||||
##### If looking for adding a specific guideline, do it here!
|
||||
# filter(GUIDELINES == "CLSI20") %>%
|
||||
filter(GUIDELINES == "CLSI21") %>%
|
||||
#####
|
||||
filter(BREAKPOINT_TYPE == "Human") %>%
|
||||
mutate(DISK_S = ifelse(as.double(DISK_S) > 50, 50, DISK_S),
|
||||
@ -52,6 +78,8 @@ rsi_trans <- bind_rows(tbl_mic, tbl_disk) %>%
|
||||
select(-ends_with("_mic"), -ends_with("_disk"))
|
||||
|
||||
# add extra CLSI general guidelines
|
||||
# Installed WHONET software on Windows (http://www.whonet.org/software.html),
|
||||
# imported C:\WHONET\Codes\DRGLST.txt
|
||||
clsi_general <- readr::read_tsv("data-raw/DRGLST.txt") %>%
|
||||
filter(CLSI == "X") %>%
|
||||
select(WHON5_CODE,
|
||||
|
@ -1 +1 @@
|
||||
67a83b234f25a303c7944222bea47d73
|
||||
a18718ce9e256567e82f33b7c5314413
|
||||
|
@ -1,269 +1,269 @@
|
||||
pattern regular_expr case_sensitive affect_ab_name affect_mo_name de nl es it fr pt da
|
||||
Coagulase-negative Staphylococcus TRUE TRUE FALSE TRUE Koagulase-negative Staphylococcus Coagulase-negatieve Staphylococcus Staphylococcus coagulasa negativo Staphylococcus negativo coagulasi Staphylococcus à coagulase négative Staphylococcus coagulase negativo Koagulase-negative stafylokokker
|
||||
Coagulase-positive Staphylococcus TRUE TRUE FALSE TRUE Koagulase-positive Staphylococcus Coagulase-positieve Staphylococcus Staphylococcus coagulasa positivo Staphylococcus positivo coagulasi Staphylococcus à coagulase positif Staphylococcus coagulase positivo Koagulase-positive stafylokokker
|
||||
Beta-haemolytic Streptococcus TRUE TRUE FALSE TRUE Beta-hämolytischer Streptococcus Beta-hemolytische Streptococcus Streptococcus Beta-hemolítico Streptococcus Beta-emolitico Streptococcus Bêta-hémolytique Streptococcus Beta-hemolítico Beta-haemolytiske streptokokker
|
||||
unknown Gram-negatives TRUE TRUE FALSE TRUE unbekannte Gramnegativen onbekende Gram-negatieven Gram negativos desconocidos Gram negativi sconosciuti Gram négatifs inconnus Gram negativos desconhecidos ukendte Gram-negative
|
||||
unknown Gram-positives TRUE TRUE FALSE TRUE unbekannte Grampositiven onbekende Gram-positieven Gram positivos desconocidos Gram positivi sconosciuti Gram positifs inconnus Gram positivos desconhecidos ukendte Gram-positive
|
||||
unknown fungus TRUE TRUE FALSE TRUE unbekannter Pilze onbekende schimmel hongo desconocido fungo sconosciuto champignon inconnu fungo desconhecido ukendt svamp
|
||||
unknown yeast TRUE TRUE FALSE TRUE unbekannte Hefe onbekende gist levadura desconocida lievito sconosciuto levure inconnue levedura desconhecida ukendt gær
|
||||
unknown name TRUE TRUE FALSE TRUE unbekannte Name onbekende naam nombre desconocido nome sconosciuto nom inconnu nome desconhecido ukendt navn
|
||||
unknown kingdom TRUE TRUE FALSE TRUE unbekanntes Reich onbekend koninkrijk reino desconocido regno sconosciuto règme inconnu reino desconhecido ukendt kongerige
|
||||
unknown phylum TRUE TRUE FALSE TRUE unbekannter Stamm onbekend fylum filo desconocido phylum sconosciuto embranchement inconnu filo desconhecido ukendt stamme
|
||||
unknown class TRUE TRUE FALSE TRUE unbekannte Klasse onbekende klasse clase desconocida classe sconosciuta classe inconnue classe desconhecida ukendt klasse
|
||||
unknown order TRUE TRUE FALSE TRUE unbekannte Ordnung onbekende orde orden desconocido ordine sconosciuto ordre inconnu ordem desconhecido ukendt orden
|
||||
unknown family TRUE TRUE FALSE TRUE unbekannte Familie onbekende familie familia desconocida famiglia sconosciuta famille inconnue família desconhecida ukendt familie
|
||||
unknown genus TRUE TRUE FALSE TRUE unbekannte Gattung onbekend geslacht género desconocido genere sconosciuto genre inconnu gênero desconhecido ukendt slægt
|
||||
unknown species TRUE TRUE FALSE TRUE unbekannte Art onbekende soort especie desconocida specie sconosciute espèce inconnue espécies desconhecida ukendt art
|
||||
unknown subspecies TRUE TRUE FALSE TRUE unbekannte Unterart onbekende ondersoort subespecie desconocida sottospecie sconosciute sous-espèce inconnue subespécies desconhecida ukendt underart
|
||||
unknown rank TRUE TRUE FALSE TRUE unbekannter Rang onbekende rang rango desconocido grado sconosciuto rang inconnu classificação desconhecido ukendt rang
|
||||
group TRUE TRUE FALSE TRUE Gruppe groep grupo gruppo groupe grupo gruppe
|
||||
CoNS FALSE TRUE FALSE TRUE KNS CNS SCN
|
||||
CoPS FALSE TRUE FALSE TRUE KPS CPS SCP
|
||||
Gram-negative TRUE TRUE FALSE FALSE Gramnegativ Gram-negatief Gram negativo Gram negativo Gram négatif Gram negativo Gram-negativ
|
||||
Gram-positive TRUE TRUE FALSE FALSE Grampositiv Gram-positief Gram positivo Gram positivo Gram positif Gram positivo Gram-positiv
|
||||
^Bacteria$ TRUE TRUE FALSE FALSE Bakterien Bacteriën Bacterias Batteri Bactéries Bactérias Bakterier
|
||||
^Fungi$ TRUE TRUE FALSE FALSE Pilze Schimmels Hongos Funghi Champignons Fungos Støbeforme
|
||||
^Yeasts$ TRUE TRUE FALSE FALSE Hefen Gisten Levaduras Lieviti Levures Leveduras Gær
|
||||
^Protozoa$ TRUE TRUE FALSE FALSE Protozoen Protozoën Protozoarios Protozoi Protozoaires Protozoários Protozoer
|
||||
biogroup TRUE TRUE FALSE FALSE Biogruppe biogroep biogrupo biogruppo biogroupe biogrupo biogruppe
|
||||
biotype TRUE TRUE FALSE FALSE Biotyp biotipo biotipo biótipo
|
||||
vegetative TRUE TRUE FALSE FALSE vegetativ vegetatief vegetativo vegetativo végétatif vegetativo
|
||||
([([ ]*?)group TRUE TRUE FALSE FALSE \\1Gruppe \\1groep \\1grupo \\1gruppo \\1groupe \\1grupo
|
||||
([([ ]*?)Group TRUE TRUE FALSE FALSE \\1Gruppe \\1Groep \\1Grupo \\1Gruppo \\1Groupe \\1Grupo
|
||||
no .*growth TRUE FALSE FALSE FALSE keine? .*wachstum geen .*groei no .*crecimientonon sem .*crescimento pas .*croissance sem .*crescimento
|
||||
no|not TRUE FALSE FALSE FALSE keine? geen|niet no|sin sem non sem
|
||||
Intermediate TRUE FALSE FALSE FALSE Mittlere Intermediair Intermedio
|
||||
Susceptible, incr. exp. FALSE TRUE FALSE FALSE Empfindlich, erh Belastung Gevoelig, hoge dosis
|
||||
susceptible, incr. exp. FALSE TRUE FALSE FALSE empfindlich, erh Belastung gevoelig, hoge dosis
|
||||
Susceptible TRUE FALSE FALSE FALSE Empfindlich Gevoelig Susceptible
|
||||
Incr. exposure TRUE FALSE FALSE FALSE Empfindlich, erh Belastung 'Incr. exposure' 'Incr. exposure'
|
||||
Resistant TRUE FALSE FALSE FALSE Resistent Resistent Resistente
|
||||
antibiotic TRUE TRUE FALSE FALSE Antibiotikum antibioticum antibiótico antibiotico antibiotique antibiótico antibiotikum
|
||||
Antibiotic TRUE TRUE FALSE FALSE Antibiotikum Antibioticum Antibiótico Antibiotico Antibiotique Antibiótico Antibiotikum
|
||||
Drug TRUE TRUE FALSE FALSE Medikament Middel Fármaco Droga Médicament Droga Lægemiddel
|
||||
drug TRUE TRUE FALSE FALSE Medikament middel fármaco droga médicament droga lægemiddel
|
||||
Frequency FALSE TRUE FALSE FALSE Zahl Aantal Frecuencia Frequenza Fréquence Frequência Frekvens
|
||||
Minimum Inhibitory Concentration (mg/L) FALSE FALSE FALSE FALSE Minimale Hemm-Konzentration (mg/L) Minimale inhiberende concentratie (mg/L) Concentración mínima inhibitoria (mg/L) Concentrazione minima inibitoria (mg/L) Concentration minimale inhibitrice (mg/L) Concentração Inibitória Mínima (mg/L) Mindste hæmmende koncentration (mg/L)
|
||||
Disk diffusion diameter (mm) FALSE FALSE FALSE FALSE Durchmesser der Scheibenzone (mm) Diameter diskzone (mm) Diámetro de difusión en disco (mm) Diametro di diffusione del disco (mm) Diamètre de diffusion en disque (mm) Diâmetro de difusão do disco (mm) Diskdiffusionsdiameter (mm)
|
||||
Antimicrobial Interpretation FALSE FALSE FALSE FALSE Antimikrobielle Auswertung Antimicrobiële interpretatie Interpretación antimicrobiana Interpretazione antimicrobica Interprétation antimicrobienne Interpretação Antimicrobiana Antimikrobiel fortolkning
|
||||
4-aminosalicylic acid FALSE TRUE TRUE FALSE 4-Aminosalicylsäure 4-aminosalicylzuur Ácido 4-aminosalicílico Acido 4-aminosalicilico Acide 4-aminosalicylique Ácido 4-aminosalicílico 4-aminosalicylsyre
|
||||
Adefovir dipivoxil FALSE TRUE TRUE FALSE Adefovir Dipivoxil Adefovir Adefovir dipivoxil Adefovir dipivoxil Adéfovir dipivoxil Adefovir dipivoxil Adefovir dipivoxil
|
||||
Aldesulfone sodium FALSE TRUE TRUE FALSE Aldesulfon-Natrium Aldesulfon Aldesulfona sódica Aldesulfone sodio Aldésulfone sodique Aldesulfona de sódio Aldesulfon-natrium
|
||||
Amikacin FALSE TRUE TRUE FALSE Amikacin Amikacine Amikacina Amikacin Amikacine Amikacin Amikacin
|
||||
Amoxicillin FALSE TRUE TRUE FALSE Amoxicillin Amoxicilline Amoxicilina Amoxicillina Amoxicilline Amoxicilina Amoxicillin
|
||||
Amoxicillin/beta-lactamase inhibitor FALSE TRUE TRUE FALSE Amoxicillin/Beta-Lactamase-Hemmer Amoxicilline/enzymremmer Amoxicilina/inhib. de la beta-lactamasa Amoxicillina/inib. d. beta-lattamasi Amoxicilline/inhib. de bêta-lactamase Amoxicilina/inibid. da beta-lactamase Amoxicillin/beta-lactamasehæmmer
|
||||
Amphotericin B FALSE TRUE TRUE FALSE Amphotericin B Amfotericine B Anfotericina B Amfotericina B Amphotéricine B Anfotericina B Amfotericin B
|
||||
Ampicillin FALSE TRUE TRUE FALSE Ampicillin Ampicilline Ampicilina Ampicillina Ampicilline Ampicilina Ampicillin
|
||||
Ampicillin/beta-lactamase inhibitor FALSE TRUE TRUE FALSE Ampicillin/Beta-Laktamase-Hemmer Ampicilline/enzymremmer Ampicilina/inhib. de la beta-lactamasa Ampicillina/inib. d. beta-lattamasi Ampicilline/inhib. de bêta-lactamase Ampicilina/inibid. da beta-lactamase Ampicillin/beta-lactamasehæmmer
|
||||
Anidulafungin FALSE TRUE TRUE FALSE Anidulafungin Anidulafungine Anidulafungina Anidulafungin Anidulafungine Anidulafungin Anidulafungin
|
||||
Azidocillin FALSE TRUE TRUE FALSE Azidocillin Azidocilline Azidocilina Azidocillina Azidocilline Azidocillin Azidocillin
|
||||
Azithromycin FALSE TRUE TRUE FALSE Azithromycin Azitromycine Azitromicina Azitromicina Azithromycine Azitromicina Azithromycin
|
||||
Azlocillin FALSE TRUE TRUE FALSE Azlocillin Azlocilline Azlocilina Azlocillina Azlocilline Azlocillin Azlocillin
|
||||
Bacampicillin FALSE TRUE TRUE FALSE Bacampicillin Bacampicilline Bacampicilina Bacampicillina Bacampicilline Bacampicilina Bacampicillin
|
||||
Bacitracin FALSE TRUE TRUE FALSE Bacitracin Bacitracine Bacitracina Bacitracina Bacitracine Bacitracin Bacitracin
|
||||
Benzathine benzylpenicillin FALSE TRUE TRUE FALSE Benzathin-Benzylpenicillin Benzylpenicillinebenzathine Bencilpenicilina benzatínica Benzatina benzilpenicillina Benzathine benzylpénicilline Benzatina benzatina benzilpenicilina Benzathinbenzylpenicillin
|
||||
Benzathine phenoxymethylpenicillin FALSE TRUE TRUE FALSE Benzathin-Phenoxymethylpenicillin Fenoxymethylpenicillinebenzathine Fenoximetilpenicilina benzatínica Benzatina fenossimetilpenicillina Phénoxyméthylpénicilline benzathine Benzatina fenoximetilpenicilina Benzathinfenoxymethylpenicillin
|
||||
Benzylpenicillin FALSE TRUE TRUE FALSE Benzylpenicillin Benzylpenicilline Bencilpenicilina Benzilpenicillina Benzylpénicilline Benzilpenicilina Benzylpenicillin
|
||||
Calcium aminosalicylate FALSE TRUE TRUE FALSE Kalzium-Aminosalicylat Aminosalicylzuur Aminosalicilato de calcio Calcio aminosalicilato Aminosalicylate de calcium Aminosalicilato de cálcio Calciumaminosalicylat
|
||||
Capreomycin FALSE TRUE TRUE FALSE Capreomycin Capreomycine Capreomicina Capreomicina Capréomycine Capreomicina Capreomycin
|
||||
Carbenicillin FALSE TRUE TRUE FALSE Carbenicillin Carbenicilline Carbenicilina Carbenicillina Carbénicilline Carbenicilina Carbenicillin
|
||||
Carindacillin FALSE TRUE TRUE FALSE Carindacillin Carindacilline Carindacilina Carindacillina Carindacilline Carindacillin Carindacillin
|
||||
Caspofungin FALSE TRUE TRUE FALSE Caspofungin Caspofungine Caspofungina Caspofungin Caspofungine Caspofungin Caspofungin
|
||||
Ce(f|ph)acetrile TRUE TRUE TRUE FALSE Cefacetril Cefacetril Cefacetrilo Cefacetrile Céphacétrile Cephacetrile Cephacetril
|
||||
Ce(f|ph)alotin TRUE TRUE TRUE FALSE Cefalotin Cefalotine Cefalotina Cefalotina Céphalotine Cefalotina Cephalotin
|
||||
Ce(f|ph)amandole TRUE TRUE TRUE FALSE Cefamandol Cefamandol Cefamandole Cephamandole Céphamandole Cephamandole Cephamandol
|
||||
Ce(f|ph)apirin TRUE TRUE TRUE FALSE Cefapirin Cefapirine Cefapirina Cefapirina Céphapirine Cephapirin Cephapirin
|
||||
Ce(f|ph)azedone TRUE TRUE TRUE FALSE Cefazedon Cefazedon Cefazedona Cefazedone Céphazédone Cephazedone Cephazedon
|
||||
Ce(f|ph)azolin TRUE TRUE TRUE FALSE Cefazolin Cefazoline Cefazolina Cephazolin Céphazoline Cephazolin Cephazolin
|
||||
Ce(f|ph)alothin TRUE TRUE TRUE FALSE Cefalothin Cefalotine Cefalotina Cefalotina Céphalothine Cephalothin Cephalothin
|
||||
Ce(f|ph)alexin TRUE TRUE TRUE FALSE Cefalexin Cefalexine Cefalexina Cephalexin Céphalexine Cephalexin Cephalexin
|
||||
Ce(f|ph)epime TRUE TRUE TRUE FALSE Cefepim Cefepim Cefepime Cephepime Céphépime Cephepime Cephepime
|
||||
Ce(f|ph)ixime TRUE TRUE TRUE FALSE Cefixim Cefixim Cefixima Cephixime Céphixime Cephixime Cephixim
|
||||
Ce(f|ph)menoxime TRUE TRUE TRUE FALSE Cefmenoxim Cefmenoxim Cefmenoxima Cephmenoxime Céphénoxime Cephmenoxime Cephmenoxim
|
||||
Ce(f|ph)metazole TRUE TRUE TRUE FALSE Cefmetazol Cefmetazol Cefmetazol Cephmetazole Céphmétazole Cefmetazole Cephmetazol
|
||||
Ce(f|ph)odizime TRUE TRUE TRUE FALSE Cefodizim Cefodizim Cefodixima Cephodizime Céphodizime Cephodizime Cephodizim
|
||||
Ce(f|ph)onicid TRUE TRUE TRUE FALSE Cefonicid Cefonicide Cefonicida Cephonicid Céphonicide Cefonicid Cephonicid
|
||||
Ce(f|ph)operazone TRUE TRUE TRUE FALSE Cefoperazon Cefoperazon Cefoperazona Cephoperazone Céphopérazone Cephoperazone Cephoperazon
|
||||
Ce(f|ph)operazone/beta-lactamase inhibitor TRUE TRUE TRUE FALSE Cefoperazon/Beta-Lactamase-Hemmer Cefoperazon/enzymremmer Cefoperazona/inhib. de betalactamasas Cephoperazone/inib. d. beta-lattamasi Céphopérazone/inhib. de bêta-lactamase Cephoperazona/inibid. da beta-lactamase Cephoperazon/beta-lactamasehæmmer
|
||||
Ce(f|ph)otaxime TRUE TRUE TRUE FALSE Cefotaxim Cefotaxim Cefotaxima Cephotaxime Céphotaxime Cephotaxime Cephotaxim
|
||||
Ce(f|ph)oxitin TRUE TRUE TRUE FALSE Cefoxitin Cefoxitine Cefoxitina Cefossitina Céphoxitine Cephoxitin Cephoxitin
|
||||
Ce(f|ph)pirome TRUE TRUE TRUE FALSE Cefpirom Cefpirom Cephpirome Cephpirome Céphpirome Cefpirome Cephpirom
|
||||
Ce(f|ph)podoxime TRUE TRUE TRUE FALSE Cefpodoxim Cefpodoxim Cefpodoxima Cephpodoxime Céphpodoxime Cephpodoxime Cephpodoxim
|
||||
Ce(f|ph)radine TRUE TRUE TRUE FALSE Cefradin Cefradine Cefradina Cefradina Céphradine Cephradine Cephradin
|
||||
Ce(f|ph)sulodin TRUE TRUE TRUE FALSE Cefsulodin Cefsulodine Cefsulodina Cephsulodin Céphsulodine Cephsulodin Cephsulodin
|
||||
Ce(f|ph)tazidime TRUE TRUE TRUE FALSE Ceftazidim Ceftazidim Ceftazidima Ceftazidima Céphtazidime Ceftazidima Cephtazidim
|
||||
Ce(f|ph)tezole TRUE TRUE TRUE FALSE Ceftezol Ceftezol Ceftezol Cephtezole Céphtézole Ceftezole Cephtezol
|
||||
Ce(f|ph)tizoxime TRUE TRUE TRUE FALSE Ceftizoxim Ceftizoxim Ceftizoxima Cephtizoxime Céphtizoxime Cephtizoxime Cephtizoxim
|
||||
Ce(f|ph)triaxone TRUE TRUE TRUE FALSE Ceftriaxon Ceftriaxon Ceftriaxona Ceftriaxone Céphtriaxone Cefhtriaxone Cephtriaxon
|
||||
Ce(f|ph)uroxime TRUE TRUE TRUE FALSE Cefuroxim Cefuroxim Cefuroxima Cefuroxima Céphuroxime Cephuroxime Cephuroxim
|
||||
Ce(f|ph)uroxime/metronidazole TRUE TRUE TRUE FALSE Cefuroxim/Metronidazol Cefuroxim/andere antibacteriele middelen Cefuroxima/metronidazol Cefuroxima/metronidazolo Céphuroxime/métronidazole Cephuroxime/metronidazol Cefuroxim/metronidazol
|
||||
Chloramphenicol FALSE TRUE TRUE FALSE Chloramphenicol Chlooramfenicol Cloranfenicol Cloramfenicolo Chloramphénicol Cloranfenicol Kloramfenicol
|
||||
Chlortetracycline FALSE TRUE TRUE FALSE Chlortetracyclin Chloortetracycline Clortetraciclina Clorotetraciclina Chlortétracycline Chlortetracycline Chlortetracyclin
|
||||
Cinoxacin FALSE TRUE TRUE FALSE Cinoxacin Cinoxacine Cinoxacina Cinoxacina Cinoxacine Cinoxacin Cinoxacin
|
||||
Ciprofloxacin FALSE TRUE TRUE FALSE Ciprofloxacin Ciprofloxacine Ciprofloxacina Ciprofloxacina Ciprofloxacine Ciprofloxacin Ciprofloxacin
|
||||
Clarithromycin FALSE TRUE TRUE FALSE Clarithromycin Claritromycine Claritromicina Claritromicina Clarithromycine Claritromicina Clarithromycin
|
||||
Clavulanic acid FALSE TRUE TRUE FALSE Clavulansäure Clavulaanzuur Ácido clavulánico Acido clavulanico Acide clavulanique Ácido clavulânico Clavulansyre
|
||||
clavulanic acid FALSE TRUE TRUE FALSE Clavulansäure clavulaanzuur ácido clavulánico acido clavulanico acide clavulanique ácido clavulânico clavulansyre
|
||||
Clindamycin FALSE TRUE TRUE FALSE Clindamycin Clindamycine Clindamicina Clindamicina Clindamycine Clindamicina Clindamycin
|
||||
Clometocillin FALSE TRUE TRUE FALSE Clometocillin Clometocilline Clometocilina Clometocillina Clométocilline Clometocillin Clometocillin
|
||||
Clotrimazole FALSE TRUE TRUE FALSE Clotrimazol Clotrimazol Clotrimazol Clotrimazolo Clotrimazole Clotrimazole Clotrimazol
|
||||
Cloxacillin FALSE TRUE TRUE FALSE Cloxacillin Cloxacilline Cloxacilina Cloxacillina Cloxacilline Cloxacillin Cloxacillin
|
||||
Colistin FALSE TRUE TRUE FALSE Colistin Colistine Colistina Colistina Colistine Colistin Colistin
|
||||
Dapsone FALSE TRUE TRUE FALSE Dapson Dapson Dapsona Dapsone Dapsone Dapsone Dapson
|
||||
Daptomycin FALSE TRUE TRUE FALSE Daptomycin Daptomycine Daptomicina Daptomicina Daptomycine Daptomicina Daptomycin
|
||||
Dibekacin FALSE TRUE TRUE FALSE Dibekacin Dibekacine Dibekacina Dibekacin Dibekacine Dibekacin Dibekacin
|
||||
Dicloxacillin FALSE TRUE TRUE FALSE Dicloxacillin Dicloxacilline Dicloxacilina Dicloxacillina Dicloxacilline Dicloxacilina Dicloxacillin
|
||||
Dirithromycin FALSE TRUE TRUE FALSE Dirithromycin Diritromycine Diritromicina Diritromicina Dirithromycine Diritromicina Dirithromycin
|
||||
Econazole FALSE TRUE TRUE FALSE Econazol Econazol Econazol Econazolo Econazole Econazole Econazol
|
||||
Enoxacin FALSE TRUE TRUE FALSE Enoxacin Enoxacine Enoxacina Enoxacina Enoxacine Enoxacin Enoxacin
|
||||
Epicillin FALSE TRUE TRUE FALSE Epicillin Epicilline Epicilina Epicillina Epicilline Epicilina Epicillin
|
||||
Erythromycin FALSE TRUE TRUE FALSE Erythromycin Erytromycine Eritromicina Eritromicina Erythromycine Eritromicina Erythromycin
|
||||
Ethambutol/isoniazid FALSE TRUE TRUE FALSE Ethambutol/Isoniazid Ethambutol/isoniazide Etambutol/isoniazida Etambutolo/isoniazide Ethambutol/isoniazide Ethambutol/isoniazid Ethambutol/isoniazid
|
||||
Fleroxacin FALSE TRUE TRUE FALSE Fleroxacin Fleroxacine Fleroxacina Fleroxacina Fléroxacine Fleroxacina Fleroxacin
|
||||
Flucloxacillin FALSE TRUE TRUE FALSE Flucloxacillin Flucloxacilline Flucloxacilina Flucloxacillina Flucloxacilline Flucloxacillin Flucloxacillin
|
||||
Fluconazole FALSE TRUE TRUE FALSE Fluconazol Fluconazol Fluconazol Fluconazolo Fluconazole Fluconazole Fluconazol
|
||||
Flucytosine FALSE TRUE TRUE FALSE Flucytosin Fluorocytosine Flucitosina Flucytosine Flucytosine Flucytosine Flucytosin
|
||||
Flurithromycin FALSE TRUE TRUE FALSE Flurithromycin Fluritromycine Fluritromicina Fluritromicina Flurithromycine Fluritromicina Flurithromycin
|
||||
Fosfomycin FALSE TRUE TRUE FALSE Fosfomycin Fosfomycine Fosfomicina Fosfomicina Fosfomycine Fosfomycin Fosfomycin
|
||||
Fusidic acid FALSE TRUE TRUE FALSE Fusidinsäure Fusidinezuur Ácido fusídico Acido fusidico Acide fusidique Ácido fusídico Fusidinsyre
|
||||
Gatifloxacin FALSE TRUE TRUE FALSE Gatifloxacin Gatifloxacine Gatifloxacina Gatifloxacina Gatifloxacine Gatifloxacin Gatifloxacin
|
||||
Gemifloxacin FALSE TRUE TRUE FALSE Gemifloxacin Gemifloxacine Gemifloxacina Gemifloxacina Gemifloxacine Gemifloxacin Gemifloxacin
|
||||
Gentamicin FALSE TRUE TRUE FALSE Gentamicin Gentamicine Gentamicina Gentamicina Gentamicine Gentamicina Gentamicin
|
||||
Grepafloxacin FALSE TRUE TRUE FALSE Grepafloxacin Grepafloxacine Grepafloxacina Grepafloxacina Grepafloxacine Grepafloxacin Grepafloxacin
|
||||
Hachimycin FALSE TRUE TRUE FALSE Hachimycin Hachimycine Hachimycin Hachimycin Hachimycine Hachimycin Hachimycin
|
||||
Hetacillin FALSE TRUE TRUE FALSE Hetacillin Hetacilline Hetacilina Hetacillin Hétacilline Hetacillin Hetacillin
|
||||
Imipenem/cilastatin FALSE TRUE TRUE FALSE Imipenem/Cilastatin Imipenem/enzymremmer Imipenem/cilastatina Imipenem/cilastatina Imipénème/cilastatine Imipenem/coteltelatina Imipenem/cilastatin
|
||||
Inosine pranobex FALSE TRUE TRUE FALSE Inosin-Pranobex Inosiplex Inosina pranobex Inosina pranobex Inosine pranobex Pranobex inosine Inosin pranobex
|
||||
Isepamicin FALSE TRUE TRUE FALSE Isepamicin Isepamicine Isepamicina Isepamicina Isepamicine Isepamicina Isepamicin
|
||||
Isoconazole FALSE TRUE TRUE FALSE Isoconazol Isoconazol Isoconazol Isoconazolo Isoconazole Isoconazole Isoconazol
|
||||
Isoniazid FALSE TRUE TRUE FALSE Isoniazid Isoniazide Isoniazida Isoniazide Isoniazide Isoniazid Isoniazid
|
||||
Itraconazole FALSE TRUE TRUE FALSE Itraconazol Itraconazol Itraconazol Itraconazolo Itraconazole Itraconazole Itraconazol
|
||||
Josamycin FALSE TRUE TRUE FALSE Josamycin Josamycine Josamicina Josamicina Josamycine Josamycin Josamycin
|
||||
Kanamycin FALSE TRUE TRUE FALSE Kanamycin Kanamycine Kanamicina Kanamicina Kanamycine Kanamycin Kanamycin
|
||||
Ketoconazole FALSE TRUE TRUE FALSE Ketoconazol Ketoconazol Ketoconazol Ketoconazolo Kétoconazole Ketoconazole Ketoconazol
|
||||
Levofloxacin FALSE TRUE TRUE FALSE Levofloxacin Levofloxacine Levofloxacina Levofloxacina Lévofloxacine Levofloxacin Levofloxacin
|
||||
Lincomycin FALSE TRUE TRUE FALSE Lincomycin Lincomycine Lincomicina Lincomicina Lincomycine Lincomycin Lincomycin
|
||||
Lomefloxacin FALSE TRUE TRUE FALSE Lomefloxacin Lomefloxacine Lomefloxacina Lomefloxacina Loméfloxacine Lomefloxacin Lomefloxacin
|
||||
Lysozyme FALSE TRUE TRUE FALSE Lysozym Lysozym Lisozima Lisozima Lysozyme Lysozyme Lysozym
|
||||
Mandelic acid FALSE TRUE TRUE FALSE Mandelsäure Amandelzuur Ácido mandélico Acido mandelico Acide mandélique Ácido mandélico Mandelinsyre
|
||||
Metampicillin FALSE TRUE TRUE FALSE Metampicillin Metampicilline Metampicilina Metampicillina Métampicilline Metampicilina Metampicillin
|
||||
Meticillin FALSE TRUE TRUE FALSE Meticillin Meticilline Meticilina Meticillina Méticilline Meticillin Meticillin
|
||||
Metisazone FALSE TRUE TRUE FALSE Metisazon Metisazon Metisazona Metisazone Métisazone Metisazone Metisazon
|
||||
Metronidazole FALSE TRUE TRUE FALSE Metronidazol Metronidazol Metronidazol Metronidazolo Métronidazole Metronidazol Metronidazol
|
||||
Mezlocillin FALSE TRUE TRUE FALSE Mezlocillin Mezlocilline Mezlocilina Mezlocillina Mezlocilline Mezlocillin Mezlocillin
|
||||
Micafungin FALSE TRUE TRUE FALSE Micafungin Micafungine Micafungina Micafungin Micafungine Micafungin Micafungin
|
||||
Miconazole FALSE TRUE TRUE FALSE Miconazol Miconazol Miconazol Miconazolo Miconazole Miconazole Miconazol
|
||||
Midecamycin FALSE TRUE TRUE FALSE Midecamycin Midecamycine Midecamicina Midecamicina Midecamycine Midecamycin Midecamycin
|
||||
Miocamycin FALSE TRUE TRUE FALSE Miocamycin Miocamycine Miocamycin Miocamicina Miocamycine Miocamicina Miocamycin
|
||||
Moxifloxacin FALSE TRUE TRUE FALSE Moxifloxacin Moxifloxacine Moxifloxacina Moxifloxacin Moxifloxacine Moxifloxacina Moxifloxacin
|
||||
Mupirocin FALSE TRUE TRUE FALSE Mupirocin Mupirocine Mupirocina Mupirocina Mupirocine Mupirocina Mupirocin
|
||||
Nalidixic acid FALSE TRUE TRUE FALSE Nalidixinsäure Nalidixinezuur Ácido nalidíxico Acido nalidixico Acide nalidixique Ácido nalidíxico Nalidixinsyre
|
||||
Neomycin FALSE TRUE TRUE FALSE Neomycin Neomycine Neomicina Neomicina Néomycine Neomicina Neomycin
|
||||
Netilmicin FALSE TRUE TRUE FALSE Netilmicin Netilmicine Netilmicina Netilmicin Netilmicine Netilmicin Netilmicin
|
||||
Nitrofurantoin FALSE TRUE TRUE FALSE Nitrofurantoin Nitrofurantoine Nitrofurantoína Nitrofurantoina Nitrofurantoïne Nitrofurantoína Nitrofurantoin
|
||||
Norfloxacin FALSE TRUE TRUE FALSE Norfloxacin Norfloxacine Norfloxacina Norfloxacina Norfloxacine Norfloxacin Norfloxacin
|
||||
Novobiocin FALSE TRUE TRUE FALSE Novobiocin Novobiocine Novobiocina Novobiocin Novobiocine Novobiocin Novobiocin
|
||||
Nystatin FALSE TRUE TRUE FALSE Nystatin Nystatine Nistatina Nystatin Nystatine Nystatin Nystatin
|
||||
Ofloxacin FALSE TRUE TRUE FALSE Ofloxacin Ofloxacine Ofloxacina Ofloxacin Ofloxacine Ofloxacin Ofloxacin
|
||||
Oleandomycin FALSE TRUE TRUE FALSE Oleandomycin Oleandomycine Oleandomicina Oleandomicina Oleandomycine Oleandomicina Oleandomycin
|
||||
Ornidazole FALSE TRUE TRUE FALSE Ornidazol Ornidazol Ornidazol Ornidazolo Ornidazole Ornidazole Ornidazol
|
||||
Oxacillin FALSE TRUE TRUE FALSE Oxacillin Oxacilline Oxacilina Oxacillina Oxacilline Oxacillin Oxacillin
|
||||
Oxolinic acid FALSE TRUE TRUE FALSE Oxolinsäure Oxolinezuur Ácido oxolínico Acido ossolinico Acide oxolinique Ácido oxolínico Oxolinsyre
|
||||
Oxytetracycline FALSE TRUE TRUE FALSE Oxytetracyclin Oxytetracycline Oxitetraciclina Ossitetraciclina Oxytétracycline Oxitetraciclina Oxytetracyclin
|
||||
Pazufloxacin FALSE TRUE TRUE FALSE Pazufloxacin Pazufloxacine Pazufloxacina Pazufloxacin Pazufloxacine Pazufloxacin Pazufloxacin
|
||||
Pefloxacin FALSE TRUE TRUE FALSE Pefloxacin Pefloxacine Pefloxacina Pefloxacina Péfloxacine Pefloxacin Pefloxacin
|
||||
Penamecillin FALSE TRUE TRUE FALSE Penamecillin Penamecilline Penamecilina Penamecillina Pénamécilline Penamecilina Penamecillin
|
||||
Penicillin FALSE TRUE TRUE FALSE Penicillin Penicilline Penicilina Penicillina Pénicilline Penicilina Penicillin
|
||||
Pheneticillin FALSE TRUE TRUE FALSE Pheneticillin Feneticilline Feneticilina Feneticillina Phénéticilline Pheneticillin Pheneticillin
|
||||
Phenoxymethylpenicillin FALSE TRUE TRUE FALSE Phenoxymethylpenicillin Fenoxymethylpenicilline Fenoximetilpenicilina Fenossimetilpenicillina Phénoxyméthylpénicilline Fenoximetilpenicilina Phenoxymethylpenicillin
|
||||
Pipemidic acid FALSE TRUE TRUE FALSE Pipemidinsäure Pipemidinezuur Ácido pipemídico Acido pipemidico Acide pipémidique Ácido pipemídico Pipemidinsyre
|
||||
Piperacillin FALSE TRUE TRUE FALSE Piperacillin Piperacilline Piperacilina Piperacillina Pipéracilline Piperacilina Piperacillin
|
||||
Piperacillin/beta-lactamase inhibitor FALSE TRUE TRUE FALSE Piperacillin/Beta-Lactamase-Hemmer Piperacilline/enzymremmer Piperacilina/inhib. de la beta-lactamasa Piperacillina/inib. d. beta-lattamasi Pipéracilline/inhib. de bêta-lactamase Piperacilina/inibid. da beta-lactamase Piperacillin/beta-lactamasehæmmer
|
||||
Piromidic acid FALSE TRUE TRUE FALSE Piromidinsäure Piromidinezuur Ácido piromídico Acido piromidico Acide piromidique Ácido piromídico Piromidinsyre
|
||||
Pivampicillin FALSE TRUE TRUE FALSE Pivampicillin Pivampicilline Pivampicilina Pivampicillina Pivampicilline Pivampicilina Pivampicillin
|
||||
Polymyxin B FALSE TRUE TRUE FALSE Polymyxin B Polymyxine B Polimixina B Polimixina B Polymyxine B Polimixina B Polymyxin B
|
||||
Posaconazole FALSE TRUE TRUE FALSE Posaconazol Posaconazol Posaconazol Posaconazolo Posaconazole Posaconazole Posaconazol
|
||||
Pristinamycin FALSE TRUE TRUE FALSE Pristinamycin Pristinamycine Pristinamicina Pristinamicina Pristinamycine Pristinamicina Pristinamycin
|
||||
Procaine benzylpenicillin FALSE TRUE TRUE FALSE Procain-Benzylpenicillin Benzylpenicillineprocaine Bencilpenicilina procaína Procaina benzilpenicillina Procaïne benzylpénicilline Procaína benzilpenicilina Prokainbenzylpenicillin
|
||||
Propicillin FALSE TRUE TRUE FALSE Propicillin Propicilline Propicilina Propicillina Propicilline Propicilina Propicillin
|
||||
Prulifloxacin FALSE TRUE TRUE FALSE Prulifloxacin Prulifloxacine Prulifloxacina Prulifloxacina Prulifloxacine Prulifloxacina Prulifloxacin
|
||||
Quinupristin/dalfopristin FALSE TRUE TRUE FALSE Quinupristin/Dalfopristin Quinupristine/dalfopristine Quinupristina/dalfopristina Quinupristina/dalfopristina Quinupristine/dalfopristine Quinupristin/dalfopristin Quinupristin/dalfopristin
|
||||
Ribostamycin FALSE TRUE TRUE FALSE Ribostamycin Ribostamycine Ribostamicina Ribostamicina Ribostamycine Ribostamicina Ribostamycin
|
||||
Rifabutin FALSE TRUE TRUE FALSE Rifabutin Rifabutine Rifabutina Rifabutina Rifabutine Rifabutin Rifabutin
|
||||
Rifampicin FALSE TRUE TRUE FALSE Rifampicin Rifampicine Rifampicina Rifampicina Rifampicine Rifampicina Rifampicin
|
||||
Rifampicin/pyrazinamide/ethambutol/isoniazid FALSE TRUE TRUE FALSE Rifampicin/Pyrazinamid/Ethambutol/Isoniazid Rifampicine/pyrazinamide/ethambutol/isoniazide Rifampicina/pirazinamida/etambutol/isoniazida Rifampicina/pirazinamide/etambutolo/isoniazide Rifampicine/pyrazinamide/éthambutol/isoniazide Rifampicina/pirazinamida/etambutol/isoniazida Rifampicin/pyrazinamid/ethambutol/isoniazid
|
||||
Rifampicin/pyrazinamide/isoniazid FALSE TRUE TRUE FALSE Rifampicin/Pyrazinamid/Isoniazid Rifampicine/pyrazinamide/isoniazide Rifampicina/pirazinamida/isoniazida Rifampicina/pirazinamide/isoniazide Rifampicine/pyrazinamide/isoniazide Rifampicina/pirazinamida/isoniazida Rifampicin/pyrazinamid/isoniazid
|
||||
Rifampicin/isoniazid FALSE TRUE TRUE FALSE Rifampicin/Isoniazid Rifampicine/isoniazide Rifampicina/isoniazida Rifampicina/isoniazide Rifampicine/isoniazide Rifampicina/isoniazida Rifampicin/isoniazid
|
||||
Rifamycin FALSE TRUE TRUE FALSE Rifamycin Rifamycine Rifamicina Rifamicina Rifamycine Rifamycin Rifamycin
|
||||
Rifaximin FALSE TRUE TRUE FALSE Rifaximin Rifaximine Rifaximina Rifaximina Rifaximine Rifaximin Rifaximin
|
||||
Rokitamycin FALSE TRUE TRUE FALSE Rokitamycin Rokitamycine Rokitamicina Rokitamicina Rokitamycine Rokitamycin Rokitamycin
|
||||
Rosoxacin FALSE TRUE TRUE FALSE Rosoxacin Rosoxacine Rosoxacina Rosoxacina Rosoxacine Rosoxacina Rosoxacin
|
||||
Roxithromycin FALSE TRUE TRUE FALSE Roxithromycin Roxitromycine Roxitromicina Roxitromicina Roxithromycine Roxitromicina Roxithromycin
|
||||
Rufloxacin FALSE TRUE TRUE FALSE Rufloxacin Rufloxacine Rufloxacina Rufloxacina Rufloxacine Rufloxacin Rufloxacin
|
||||
Sisomicin FALSE TRUE TRUE FALSE Sisomicin Sisomicine Sisomicina Sisomicina Sisomicine Sisomicina Sisomicin
|
||||
Sodium aminosalicylate FALSE TRUE TRUE FALSE Natrium-Aminosalicylat Aminosalicylzuur Aminosalicilato de sodio Sodio aminosalicilato Aminosalicylate de sodium Aminosalicilato de sódio Natriumaminosalicylat
|
||||
Sparfloxacin FALSE TRUE TRUE FALSE Sparfloxacin Sparfloxacine Esparfloxacina Sparfloxacina Sparfloxacine Sparfloxacin Sparfloxacin
|
||||
Spectinomycin FALSE TRUE TRUE FALSE Spectinomycin Spectinomycine Espectinomicina Spectinomycin Spectinomycine Spectinomycin Spectinomycin
|
||||
Spiramycin FALSE TRUE TRUE FALSE Spiramycin Spiramycine Espiramicina Spiramicina Spiramycine Spiramycin Spiramycin
|
||||
Spiramycin/metronidazole FALSE TRUE TRUE FALSE Spiramycin/Metronidazol Spiramycine/metronidazol Espiramicina/metronidazol Spiramicina/metronidazolo Spiramycine/métronidazole Spiramycin/metronidazol Spiramycin/metronidazol
|
||||
Staphylococcus immunoglobulin FALSE TRUE TRUE FALSE Staphylococcus-Immunoglobulin Stafylokokkenimmunoglobuline Inmunoglobulina estafilocócica Immunoglobulina per stafilococco Immunoglobuline staphylococcique Imunoglobulina de Staphylococcus Stafylokok-immunglobulin
|
||||
Streptoduocin FALSE TRUE TRUE FALSE Streptoduocin Streptoduocine Estreptoduocina Streptoduocin Streptoduocine Estreptoduocina Streptoduocin
|
||||
Streptomycin FALSE TRUE TRUE FALSE Streptomycin Streptomycine Estreptomicina Streptomicina Streptomycine Streptomycin Streptomycin
|
||||
Streptomycin/isoniazid FALSE TRUE TRUE FALSE Streptomycin/Isoniazid Streptomycine/isoniazide Estreptomicina/isoniazida Streptomicina/isoniazide Streptomycine/isoniazide Streptomicina/isoniazida Streptomycin/isoniazid
|
||||
Sulbenicillin FALSE TRUE TRUE FALSE Sulbenicillin Sulbenicilline Sulbenicilina Sulbenicillina Sulbenicilline Sulbenicilina Sulbenicillin
|
||||
Sulfadiazine/tetroxoprim FALSE TRUE TRUE FALSE Sulfadiazin/Tetroxoprim Sulfadiazine/tetroxoprim Sulfadiazina/tetroxoprim Sulfadiazina/tetroxoprim Sulfadiazine/tetroxoprime Sulfadiazina/tetroxoprim Sulfadiazin/tetroxoprim
|
||||
Sulfadiazine/trimethoprim FALSE TRUE TRUE FALSE Sulfadiazin/Trimethoprim Sulfadiazine/trimethoprim Sulfadiazina/trimetoprima Sulfadiazina/trimetoprim Sulfadiazine/triméthoprime Sulfadiazina/trimethoprim Sulfadiazin/trimethoprim
|
||||
Sulfadimidine/trimethoprim FALSE TRUE TRUE FALSE Sulfadimidin/Trimethoprim Sulfadimidine/trimethoprim Sulfadimidina/trimetoprima Sulfadimidina/trimetoprim Sulfadimidine/triméthoprime Sulfadimidina/trimethoprim Sulfadimidin/trimethoprim
|
||||
Sulfafurazole FALSE TRUE TRUE FALSE Sulfafurazol Sulfafurazol Sulfafurazol Sulfafurazolo Sulfafurazole Sulfafurazole Sulfafurazol
|
||||
Sulfaisodimidine FALSE TRUE TRUE FALSE Sulfaisodimidin Sulfisomidine Sulfaisodimidina Sulfaisodimidina Sulfaisodimidine Sulfaisodimidina Sulfaisodimidin
|
||||
Sulfalene FALSE TRUE TRUE FALSE Sulfalene Sulfaleen Sulfaleno Sulfalene Sulfalène Sulfaleno Sulfalen
|
||||
Sulfamazone FALSE TRUE TRUE FALSE Sulfamazon Sulfamazon Sulfamazona Sulfamazone Sulfamazone Sulfamazona Sulfamazon
|
||||
Sulfamerazine/trimethoprim FALSE TRUE TRUE FALSE Sulfamerazin/Trimethoprim Sulfamerazine/trimethoprim Sulfamerazina/trimetoprima Sulfamerazina/trimetoprim Sulfamérazine/triméthoprime Sulfamerazina/trimethoprim Sulfamerazin/trimethoprim
|
||||
Sulfamethizole FALSE TRUE TRUE FALSE Sulfamethizol Sulfamethizol Sulfametozol Sulfamethizolo Sulfaméthizole Sulfametizole Sulfamethizol
|
||||
Sulfamethoxazole FALSE TRUE TRUE FALSE Sulfamethoxazol Sulfamethoxazol Sulfametoxazol Sulfametossazolo Sulfaméthoxazole Sulfamethoxazole Sulfamethoxazol
|
||||
Sulfamethoxazole/trimethoprim FALSE TRUE TRUE FALSE Sulfamethoxazol/Trimethoprim Sulfamethoxazol/trimethoprim Sulfametoxazol/trimetoprima Sulfametossazolo/trimetoprim Sulfaméthoxazole/triméthoprime Sulfametoxazol/trimethoprim Sulfamethoxazol/trimethoprim
|
||||
Sulfametoxydiazine FALSE TRUE TRUE FALSE Sulfametoxydiazin Sulfamethoxydiazine Sulfametoxidiazina Sulfametoxydiazine Sulfamétoxydiazine Sulfametoxidiazina Sulfametoxydiazin
|
||||
Sulfametrole/trimethoprim FALSE TRUE TRUE FALSE Sulfametrole/Trimethoprim Sulfametrol/trimethoprim Sulfametrol/trimetoprima Sulfametrole/trimetoprim Sulfamétrole/triméthoprime Sulfametrole/trimethoprim Sulfametrol/trimethoprim
|
||||
Sulfamoxole FALSE TRUE TRUE FALSE Sulfamoxol Sulfamoxol Sulfamoxole Sulfamoxolo Sulfamoxole Sulfamoxole Sulfamoxol
|
||||
Sulfamoxole/trimethoprim FALSE TRUE TRUE FALSE Sulfamoxol/Trimethoprim Sulfamoxol/trimethoprim Sulfamoxol/trimetoprima Sulfamoxolo/trimetoprim Sulfamoxole/triméthoprime Sulfamoxole/trimethoprim Sulfamoxol/trimethoprim
|
||||
Sulfaperin FALSE TRUE TRUE FALSE Sulfaperin Sulfaperine Sulfametoxazol Sulfaperin Sulfapérine Sulfaperin Sulfaperin
|
||||
Sulfaphenazole FALSE TRUE TRUE FALSE Sulfaphenazol Sulfafenazol Sulfafenazol Sulfafenazolo Sulfaphénazole Sulfafenazol Sulfaphenazol
|
||||
Sulfathiazole FALSE TRUE TRUE FALSE Sulfathiazol Sulfathiazol Sulfatiazol Sulfathiazole Sulfathiazole Sulfatazol Sulfathiazol
|
||||
Sulfathiourea FALSE TRUE TRUE FALSE Sulfathioharnstoff Sulfathioureum Sulfathiourea Sulfathiourea Sulfathiourée Sulfathiourea Sulfathiourea
|
||||
Sultamicillin FALSE TRUE TRUE FALSE Sultamicillin Sultamicilline Sultamicilina Sultamicillina Sultamicilline Sultamicillin Sultamicillin
|
||||
Talampicillin FALSE TRUE TRUE FALSE Talampicillin Talampicilline Talampicilina Talampicillina Talampicilline Talampicilina Talampicillin
|
||||
Teicoplanin FALSE TRUE TRUE FALSE Teicoplanin Teicoplanine Teicoplanina Teicoplanina Teicoplanine Teicoplanin Teicoplanin
|
||||
Telithromycin FALSE TRUE TRUE FALSE Telithromycin Telitromycine Telitromicina Telitromicina Télithromycine Telitromicina Telithromycin
|
||||
Temafloxacin FALSE TRUE TRUE FALSE Temafloxacin Temafloxacine Temafloxacina Temafloxacina Temafloxacine Temafloxacin Temafloxacin
|
||||
Temocillin FALSE TRUE TRUE FALSE Temocillin Temocilline Temocilina Temocillina Temocillin Temocillin Temocillin
|
||||
Tenofovir disoproxil FALSE TRUE TRUE FALSE Tenofovir Disoproxil Tenofovir Tenofovir disoproxil Tenofovir disoproxil Tenofovir disoproxil Tenofovir disoproxil Tenofovir disoproxil
|
||||
Terizidone FALSE TRUE TRUE FALSE Terizidon Terizidon Terizidona Terizidone Terizidone Terizidone Terizidon
|
||||
Thiamphenicol FALSE TRUE TRUE FALSE Thiamphenicol Thiamfenicol Tiamfenicol Tiamfenicolo Thiamphénicol Tiamfenicol Thiamphenicol
|
||||
Thioacetazone/isoniazid FALSE TRUE TRUE FALSE Thioacetazon/Isoniazid Thioacetazon/isoniazide Tioacetazona/isoniazida Tioacetazone/isoniazide Thioacétazone/isoniazide Thioacetazone/isoniazid Thioacetazon/isoniazid
|
||||
Ticarcillin FALSE TRUE TRUE FALSE Ticarcillin Ticarcilline Ticarcilina Ticarcillina Ticarcilline Ticarcilina Ticarcillin
|
||||
Ticarcillin/beta-lactamase inhibitor FALSE TRUE TRUE FALSE Ticarcillin/Beta-Lactamase-Hemmer Ticarcilline/enzymremmer Ticarcilina/inhib. de la betalactamasa Ticarcillina/inib. d. beta-lattamasi Ticarcilline/inhib. de bêta-lactamase Ticarcilina/inibid. da beta-lactamase Ticarcillin/beta-lactamasehæmmer
|
||||
Ticarcillin/clavulanic acid FALSE TRUE TRUE FALSE Ticarcillin/Clavulansäure Ticarcilline/clavulaanzuur Ticarcilina/ácido clavulánico Ticarcillina/acido clavulanico Ticarcilline/acide clavulanique Ticarcilina/ácido clavulanico Ticarcillin/clavulansyre
|
||||
Tinidazole FALSE TRUE TRUE FALSE Tinidazol Tinidazol Tinidazol Tinidazolo Tinidazole Tinidazole Tinidazol
|
||||
Tobramycin FALSE TRUE TRUE FALSE Tobramycin Tobramycine Tobramicina Tobramicina Tobramycine Tobramycin Tobramycin
|
||||
Trimethoprim/sulfamethoxazole FALSE TRUE TRUE FALSE Trimethoprim/Sulfamethoxazol Cotrimoxazol Trimetoprima/sulfametoxazol Trimetoprim/sulfametossazolo Triméthoprime/sulfaméthoxazole Trimethoprim/sulfametoxazol Trimethoprim/sulfamethoxazol
|
||||
Troleandomycin FALSE TRUE TRUE FALSE Troleandomycin Troleandomycine Troleandomicina Troleandomicina Troleandomycine Troleandomicina Troleandomycin
|
||||
Trovafloxacin FALSE TRUE TRUE FALSE Trovafloxacin Trovafloxacine Trovafloxacina Trovafloxacin Trovafloxacine Trovafloxacin Trovafloxacin
|
||||
Vancomycin FALSE TRUE TRUE FALSE Vancomycin Vancomycine Vancomicina Vancomicina Vancomycine Vancomycin Vancomycin
|
||||
Voriconazole FALSE TRUE TRUE FALSE Voriconazol Voriconazol Voriconazol Voriconazolo Voriconazole Voriconazol Voriconazol
|
||||
Aminoglycosides FALSE TRUE TRUE FALSE Aminoglykoside Aminoglycosiden Aminoglucósidos Aminoglicosidi Aminoglycosides Aminoglycosides Aminoglykosider
|
||||
Amphenicols FALSE TRUE TRUE FALSE Amphenicole Amfenicolen Anfenicoles Amphenicols Amphénicols Anfenicóis Amphenicoler
|
||||
Antifungals/antimycotics FALSE TRUE TRUE FALSE Antimykotika/Antimykotika Antifungica/antimycotica Antifúngicos/antimicóticos Antifungini/antimicotici Antifongiques/antimycotiques Antifúngicos/antimicóticos Antimykotika/antimykotika
|
||||
Antimycobacterials FALSE TRUE TRUE FALSE Antimykobakterielle Mittel Antimycobacteriele middelen Antimicrobianos Antimicobatterici Antimycobactériens Antimycobacterials Antimycobakterier
|
||||
Beta-lactams/penicillins FALSE TRUE TRUE FALSE Beta-Lactame/Penicilline Beta-lactams/penicillines Beta-lactámicos/penicilinas Beta-lattami/penicilline Bêta-lactamines/pénicillines Beta-lactâmicas/penicilinas Beta-lactamer/penicilliner
|
||||
Cephalosporins (1st gen.) FALSE TRUE TRUE FALSE Cephalosporine (1. Gen.) Cefalosporines (1e gen.) Cefalosporinas (1er gen.) Cefalosporine (1° gen.) Céphalosporines (1ère génération) Cefalosporinas (1º género) Cefalosporiner (1. gen.)
|
||||
Cephalosporins (2nd gen.) FALSE TRUE TRUE FALSE Cephalosporine (2. Gen.) Cefalosporines (2e gen.) Cefalosporinas (2do gen.) Cefalosporine (2° gen.) Céphalosporines (2ème génération) Cefalosporinas (2ª gen.) Cefalosporiner (2. gen.)
|
||||
Cephalosporins (3rd gen.) FALSE TRUE TRUE FALSE Cephalosporine (3. Gen.) Cefalosporines (3e gen.) Cefalosporinas (3er gen.) Cefalosporine (3° gen.) Céphalosporines (3ème génération) Cefalosporinas (3ª gen.) Cefalosporiner (3. gen.)
|
||||
Cephalosporins (4th gen.) FALSE TRUE TRUE FALSE Cephalosporine (4. Gen.) Cefalosporines (4e gen.) Cefalosporinas (4ª gen.) Cefalosporine (4° gen.) Céphalosporines (4ème génération) Cefalosporinas (4.ª gen.) Cefalosporiner (4. gen.)
|
||||
Cephalosporins (5th gen.) FALSE TRUE TRUE FALSE Cephalosporine (5. Gen.) Cefalosporines (5e gen.) Cefalosporinas (5º gen.) Cefalosporine (5° gen.) Céphalosporines (5e gén.) Cefalosporinas (5.ª gen.) Cefalosporiner (5. gen.)
|
||||
Cephalosporins (unclassified gen.) FALSE TRUE TRUE FALSE Cephalosporine (unklassifiziert) Cefalosporines (ongeclassificeerd) Cefalosporinas (gen. no clasificado) Cefalosporine (gen. non classificato) Céphalosporines (genre non classifié) Cefalosporinas (não classificado gen.) Cefalosporiner (uklassificeret gen.)
|
||||
Cephalosporins FALSE TRUE TRUE FALSE Cephalosporine Cefalosporines Cefalosporinas Cefalosporine Céphalosporines Cefalosporinas Cefalosporiner
|
||||
Glycopeptides FALSE TRUE TRUE FALSE Glykopeptide Glycopeptiden Glicopéptidos Glicopeptidi Glycopeptides Glycopeptides Glykopeptider
|
||||
Macrolides/lincosamides FALSE TRUE TRUE FALSE Makrolide/Linkosamide Macroliden/lincosamiden Macrólidos/lincosamidas Macrolidi/lincosamidi Macrolides/lincosamides Macrolides/lincosamidas Makrolider/lincosamider
|
||||
Other antibacterials FALSE TRUE TRUE FALSE Andere Antibiotika Overige antibiotica Otros antibacterianos Altri antibatterici Autres antibactériens Outros antibacterianos Andre antibakterielle stoffer
|
||||
Polymyxins FALSE TRUE TRUE FALSE Polymyxine Polymyxines Polimixinas Polimixine Polymyxines Polimixinas Polymyxiner
|
||||
Quinolones FALSE TRUE TRUE FALSE Quinolone Quinolonen Quinolonas Chinoloni Quinolones Quinolones Kinoloner
|
||||
pattern regular_expr case_sensitive affect_ab_name affect_mo_name de nl es it fr pt da sv ru
|
||||
Coagulase-negative Staphylococcus TRUE TRUE FALSE TRUE Koagulase-negative Staphylococcus Coagulase-negatieve Staphylococcus Staphylococcus coagulasa negativo Staphylococcus negativo coagulasi Staphylococcus à coagulase négative Staphylococcus coagulase negativo Koagulase-negative stafylokokker Koagulasnegativa stafylokocker Коагулазоотрицательный стафилококк
|
||||
Coagulase-positive Staphylococcus TRUE TRUE FALSE TRUE Koagulase-positive Staphylococcus Coagulase-positieve Staphylococcus Staphylococcus coagulasa positivo Staphylococcus positivo coagulasi Staphylococcus à coagulase positif Staphylococcus coagulase positivo Koagulase-positive stafylokokker Koagulaspositiva stafylokocker Коагулазоположительный стафилококк
|
||||
Beta-haemolytic Streptococcus TRUE TRUE FALSE TRUE Beta-hämolytischer Streptococcus Beta-hemolytische Streptococcus Streptococcus Beta-hemolítico Streptococcus Beta-emolitico Streptococcus Bêta-hémolytique Streptococcus Beta-hemolítico Beta-haemolytiske streptokokker Beta-hemolytiska streptokocker Бета-гемолитический стрептококк
|
||||
unknown Gram-negatives TRUE TRUE FALSE TRUE unbekannte Gramnegativen onbekende Gram-negatieven Gram negativos desconocidos Gram negativi sconosciuti Gram négatifs inconnus Gram negativos desconhecidos ukendte Gram-negative okända gramnegativa bakterier неизвестные грамотрицательные
|
||||
unknown Gram-positives TRUE TRUE FALSE TRUE unbekannte Grampositiven onbekende Gram-positieven Gram positivos desconocidos Gram positivi sconosciuti Gram positifs inconnus Gram positivos desconhecidos ukendte Gram-positive okända Gram-positiva неизвестные грамположительные
|
||||
unknown fungus TRUE TRUE FALSE TRUE unbekannter Pilze onbekende schimmel hongo desconocido fungo sconosciuto champignon inconnu fungo desconhecido ukendt svamp Okänd svamp неизвестный грибок
|
||||
unknown yeast TRUE TRUE FALSE TRUE unbekannte Hefe onbekende gist levadura desconocida lievito sconosciuto levure inconnue levedura desconhecida ukendt gær Okänd jäst неизвестные дрожжи
|
||||
unknown name TRUE TRUE FALSE TRUE unbekannte Name onbekende naam nombre desconocido nome sconosciuto nom inconnu nome desconhecido ukendt navn okänt namn неизвестное название
|
||||
unknown kingdom TRUE TRUE FALSE TRUE unbekanntes Reich onbekend koninkrijk reino desconocido regno sconosciuto règme inconnu reino desconhecido ukendt kongerige okänt rike неизвестное царство
|
||||
unknown phylum TRUE TRUE FALSE TRUE unbekannter Stamm onbekend fylum filo desconocido phylum sconosciuto embranchement inconnu filo desconhecido ukendt stamme okänt fylum неизвестный филум
|
||||
unknown class TRUE TRUE FALSE TRUE unbekannte Klasse onbekende klasse clase desconocida classe sconosciuta classe inconnue classe desconhecida ukendt klasse okänd klass неизвестный класс
|
||||
unknown order TRUE TRUE FALSE TRUE unbekannte Ordnung onbekende orde orden desconocido ordine sconosciuto ordre inconnu ordem desconhecido ukendt orden okänd ordning неизвестный порядок
|
||||
unknown family TRUE TRUE FALSE TRUE unbekannte Familie onbekende familie familia desconocida famiglia sconosciuta famille inconnue família desconhecida ukendt familie okänd familj неизвестное семейство
|
||||
unknown genus TRUE TRUE FALSE TRUE unbekannte Gattung onbekend geslacht género desconocido genere sconosciuto genre inconnu gênero desconhecido ukendt slægt okänt släkte неизвестный род
|
||||
unknown species TRUE TRUE FALSE TRUE unbekannte Art onbekende soort especie desconocida specie sconosciute espèce inconnue espécies desconhecida ukendt art okänd art неизвестный вид
|
||||
unknown subspecies TRUE TRUE FALSE TRUE unbekannte Unterart onbekende ondersoort subespecie desconocida sottospecie sconosciute sous-espèce inconnue subespécies desconhecida ukendt underart okänd underart неизвестный подвид
|
||||
unknown rank TRUE TRUE FALSE TRUE unbekannter Rang onbekende rang rango desconocido grado sconosciuto rang inconnu classificação desconhecido ukendt rang okänd rang неизвестный ранг
|
||||
group TRUE TRUE FALSE TRUE Gruppe groep grupo gruppo groupe grupo gruppe grupp группа
|
||||
CoNS FALSE TRUE FALSE TRUE KNS CNS SCN KNS KNS КОС
|
||||
CoPS FALSE TRUE FALSE TRUE KPS CPS SCP KPS KPS КПС
|
||||
Gram-negative TRUE TRUE FALSE FALSE Gramnegativ Gram-negatief Gram negativo Gram negativo Gram négatif Gram negativo Gram-negativ Gram-negativ Грамотрицательные
|
||||
Gram-positive TRUE TRUE FALSE FALSE Grampositiv Gram-positief Gram positivo Gram positivo Gram positif Gram positivo Gram-positiv Gram-positiv Грамположительные
|
||||
^Bacteria$ TRUE TRUE FALSE FALSE Bakterien Bacteriën Bacterias Batteri Bactéries Bactérias Bakterier Bakterier Бактерии
|
||||
^Fungi$ TRUE TRUE FALSE FALSE Pilze Schimmels Hongos Funghi Champignons Fungos Støbeforme Svampar Грибы
|
||||
^Yeasts$ TRUE TRUE FALSE FALSE Hefen Gisten Levaduras Lieviti Levures Leveduras Gær Jästdjur Животные
|
||||
^Protozoa$ TRUE TRUE FALSE FALSE Protozoen Protozoën Protozoarios Protozoi Protozoaires Protozoários Protozoer Protozoer Протозоа
|
||||
biogroup TRUE TRUE FALSE FALSE Biogruppe biogroep biogrupo biogruppo biogroupe biogrupo biogruppe biogrupp биогруппа
|
||||
biotype TRUE TRUE FALSE FALSE Biotyp biotipo biotipo biótipo biotype biotyp биотип
|
||||
vegetative TRUE TRUE FALSE FALSE vegetativ vegetatief vegetativo vegetativo végétatif vegetativo vegetativ vegetativ вегетативный
|
||||
([([ ]*?)group TRUE TRUE FALSE FALSE \\1Gruppe \\1groep \\1grupo \\1gruppo \\1groupe \\1grupo \\1gruppe \\1grupp \\1группа
|
||||
([([ ]*?)Group TRUE TRUE FALSE FALSE \\1Gruppe \\1Groep \\1Grupo \\1Gruppo \\1Groupe \\1Grupo \\1Gruppe \\1Grupp \\1Группа
|
||||
no .*growth TRUE FALSE FALSE FALSE keine? .*wachstum geen .*groei no .*crecimientonon sem .*crescimento pas .*croissance sem .*crescimento ingen .*vækst ingen .*tillväxt отсутствие.*роста
|
||||
no|not TRUE FALSE FALSE FALSE keine? geen|niet no|sin sem non sem nej|ikke nej|inte нет?
|
||||
Intermediate TRUE FALSE FALSE FALSE Mittlere Intermediair Intermedio
|
||||
Susceptible, incr. exp. FALSE TRUE FALSE FALSE Empfindlich, erh Belastung Gevoelig, hoge dosis
|
||||
susceptible, incr. exp. FALSE TRUE FALSE FALSE empfindlich, erh Belastung gevoelig, hoge dosis
|
||||
Susceptible TRUE FALSE FALSE FALSE Empfindlich Gevoelig Susceptible
|
||||
Incr. exposure TRUE FALSE FALSE FALSE Empfindlich, erh Belastung 'Incr. exposure' 'Incr. exposure'
|
||||
Resistant TRUE FALSE FALSE FALSE Resistent Resistent Resistente
|
||||
antibiotic TRUE TRUE FALSE FALSE Antibiotikum antibioticum antibiótico antibiotico antibiotique antibiótico antibiotikum antibiotika антибиотик
|
||||
Antibiotic TRUE TRUE FALSE FALSE Antibiotikum Antibioticum Antibiótico Antibiotico Antibiotique Antibiótico Antibiotikum Antibiotika Антибиотик
|
||||
Drug TRUE TRUE FALSE FALSE Medikament Middel Fármaco Droga Médicament Droga Lægemiddel Läkemedel Лекарство
|
||||
drug TRUE TRUE FALSE FALSE Medikament middel fármaco droga médicament droga lægemiddel läkemedel лекарство
|
||||
Frequency FALSE TRUE FALSE FALSE Zahl Aantal Frecuencia Frequenza Fréquence Frequência Frekvens Frekvens Частота
|
||||
Minimum Inhibitory Concentration (mg/L) FALSE FALSE FALSE FALSE Minimale Hemm-Konzentration (mg/L) Minimale inhiberende concentratie (mg/L) Concentración mínima inhibitoria (mg/L) Concentrazione minima inibitoria (mg/L) Concentration minimale inhibitrice (mg/L) Concentração Inibitória Mínima (mg/L) Mindste hæmmende koncentration (mg/L) Minsta hämmande koncentration (mg/L) Минимальная ингибирующая концентрация (мг/л)
|
||||
Disk diffusion diameter (mm) FALSE FALSE FALSE FALSE Durchmesser der Scheibenzone (mm) Diameter diskzone (mm) Diámetro de difusión en disco (mm) Diametro di diffusione del disco (mm) Diamètre de diffusion en disque (mm) Diâmetro de difusão do disco (mm) Diskdiffusionsdiameter (mm) Diskdiffusionsdiameter (mm) Диаметр диффузии диска (мм)
|
||||
Antimicrobial Interpretation FALSE FALSE FALSE FALSE Antimikrobielle Auswertung Antimicrobiële interpretatie Interpretación antimicrobiana Interpretazione antimicrobica Interprétation antimicrobienne Interpretação Antimicrobiana Antimikrobiel fortolkning Antimikrobiell tolkning Антимикробная интерпретация
|
||||
4-aminosalicylic acid FALSE TRUE TRUE FALSE 4-Aminosalicylsäure 4-aminosalicylzuur Ácido 4-aminosalicílico Acido 4-aminosalicilico Acide 4-aminosalicylique Ácido 4-aminosalicílico 4-aminosalicylsyre 4-aminosalicylsyra 4-аминосалициловая кислота
|
||||
Adefovir dipivoxil FALSE TRUE TRUE FALSE Adefovir Dipivoxil Adefovir Adefovir dipivoxil Adefovir dipivoxil Adéfovir dipivoxil Adefovir dipivoxil Adefovir dipivoxil Adefovir dipivoxil Адефовир дипивоксил
|
||||
Aldesulfone sodium FALSE TRUE TRUE FALSE Aldesulfon-Natrium Aldesulfon Aldesulfona sódica Aldesulfone sodio Aldésulfone sodique Aldesulfona de sódio Aldesulfon-natrium Aldesulfonnatrium Альдесульфон натрия
|
||||
Amikacin FALSE TRUE TRUE FALSE Amikacin Amikacine Amikacina Amikacin Amikacine Amikacin Amikacin Amikacin Амикацин
|
||||
Amoxicillin FALSE TRUE TRUE FALSE Amoxicillin Amoxicilline Amoxicilina Amoxicillina Amoxicilline Amoxicilina Amoxicillin Amoxicillin Амоксициллин
|
||||
Amoxicillin/beta-lactamase inhibitor FALSE TRUE TRUE FALSE Amoxicillin/Beta-Lactamase-Hemmer Amoxicilline/enzymremmer Amoxicilina/inhib. de la beta-lactamasa Amoxicillina/inib. d. beta-lattamasi Amoxicilline/inhib. de bêta-lactamase Amoxicilina/inibid. da beta-lactamase Amoxicillin/beta-lactamasehæmmer Amoxicillin/betalaktamashämmare Амоксициллин/ингибитор бета-лактамаз
|
||||
Amphotericin B FALSE TRUE TRUE FALSE Amphotericin B Amfotericine B Anfotericina B Amfotericina B Amphotéricine B Anfotericina B Amfotericin B Amfotericin B Амфотерицин В
|
||||
Ampicillin FALSE TRUE TRUE FALSE Ampicillin Ampicilline Ampicilina Ampicillina Ampicilline Ampicilina Ampicillin Ampicillin Ампициллин
|
||||
Ampicillin/beta-lactamase inhibitor FALSE TRUE TRUE FALSE Ampicillin/Beta-Laktamase-Hemmer Ampicilline/enzymremmer Ampicilina/inhib. de la beta-lactamasa Ampicillina/inib. d. beta-lattamasi Ampicilline/inhib. de bêta-lactamase Ampicilina/inibid. da beta-lactamase Ampicillin/beta-lactamasehæmmer Ampicillin/beta-laktamashämmare Ампициллин/ингибитор бета-лактамазы
|
||||
Anidulafungin FALSE TRUE TRUE FALSE Anidulafungin Anidulafungine Anidulafungina Anidulafungin Anidulafungine Anidulafungin Anidulafungin Anidulafungin Анидулафунгин
|
||||
Azidocillin FALSE TRUE TRUE FALSE Azidocillin Azidocilline Azidocilina Azidocillina Azidocilline Azidocillin Azidocillin Azidocillin Азидоциллин
|
||||
Azithromycin FALSE TRUE TRUE FALSE Azithromycin Azitromycine Azitromicina Azitromicina Azithromycine Azitromicina Azithromycin Azitromycin Азитромицин
|
||||
Azlocillin FALSE TRUE TRUE FALSE Azlocillin Azlocilline Azlocilina Azlocillina Azlocilline Azlocillin Azlocillin Azlocillin Азлоциллин
|
||||
Bacampicillin FALSE TRUE TRUE FALSE Bacampicillin Bacampicilline Bacampicilina Bacampicillina Bacampicilline Bacampicilina Bacampicillin Bacampicillin Бакампициллин
|
||||
Bacitracin FALSE TRUE TRUE FALSE Bacitracin Bacitracine Bacitracina Bacitracina Bacitracine Bacitracin Bacitracin Bacitracin Бацитрацин
|
||||
Benzathine benzylpenicillin FALSE TRUE TRUE FALSE Benzathin-Benzylpenicillin Benzylpenicillinebenzathine Bencilpenicilina benzatínica Benzatina benzilpenicillina Benzathine benzylpénicilline Benzatina benzatina benzilpenicilina Benzathinbenzylpenicillin Benzathinbenzylpenicillin Бензатин бензилпенициллин
|
||||
Benzathine phenoxymethylpenicillin FALSE TRUE TRUE FALSE Benzathin-Phenoxymethylpenicillin Fenoxymethylpenicillinebenzathine Fenoximetilpenicilina benzatínica Benzatina fenossimetilpenicillina Phénoxyméthylpénicilline benzathine Benzatina fenoximetilpenicilina Benzathinfenoxymethylpenicillin Bensathinfenoximetylpenicillin Бензатин феноксиметилпенициллин
|
||||
Benzylpenicillin FALSE TRUE TRUE FALSE Benzylpenicillin Benzylpenicilline Bencilpenicilina Benzilpenicillina Benzylpénicilline Benzilpenicilina Benzylpenicillin Bensylpenicillin Бензилпенициллин
|
||||
Calcium aminosalicylate FALSE TRUE TRUE FALSE Kalzium-Aminosalicylat Aminosalicylzuur Aminosalicilato de calcio Calcio aminosalicilato Aminosalicylate de calcium Aminosalicilato de cálcio Calciumaminosalicylat Kalciumaminosalicylat Аминосалицилат кальция
|
||||
Capreomycin FALSE TRUE TRUE FALSE Capreomycin Capreomycine Capreomicina Capreomicina Capréomycine Capreomicina Capreomycin Kapreomycin Капреомицин
|
||||
Carbenicillin FALSE TRUE TRUE FALSE Carbenicillin Carbenicilline Carbenicilina Carbenicillina Carbénicilline Carbenicilina Carbenicillin Karbenicillin Карбенициллин
|
||||
Carindacillin FALSE TRUE TRUE FALSE Carindacillin Carindacilline Carindacilina Carindacillina Carindacilline Carindacillin Carindacillin Carindacillin Кариндациллин
|
||||
Caspofungin FALSE TRUE TRUE FALSE Caspofungin Caspofungine Caspofungina Caspofungin Caspofungine Caspofungin Caspofungin Caspofungin Каспофунгин
|
||||
Ce(f|ph)acetrile TRUE TRUE TRUE FALSE Cefacetril Cefacetril Cefacetrilo Cefacetrile Céphacétrile Cephacetrile Cephacetril Cephacetril Цефацетрил
|
||||
Ce(f|ph)alotin TRUE TRUE TRUE FALSE Cefalotin Cefalotine Cefalotina Cefalotina Céphalotine Cefalotina Cephalotin Cefalotin Цефалотин
|
||||
Ce(f|ph)amandole TRUE TRUE TRUE FALSE Cefamandol Cefamandol Cefamandole Cephamandole Céphamandole Cephamandole Cephamandol Cephamandol Цефамандол
|
||||
Ce(f|ph)apirin TRUE TRUE TRUE FALSE Cefapirin Cefapirine Cefapirina Cefapirina Céphapirine Cephapirin Cephapirin Cephapirin Цефапирин
|
||||
Ce(f|ph)azedone TRUE TRUE TRUE FALSE Cefazedon Cefazedon Cefazedona Cefazedone Céphazédone Cephazedone Cephazedon Cephazedon Цефазедон
|
||||
Ce(f|ph)azolin TRUE TRUE TRUE FALSE Cefazolin Cefazoline Cefazolina Cephazolin Céphazoline Cephazolin Cephazolin Cephazolin Цефазолин
|
||||
Ce(f|ph)alothin TRUE TRUE TRUE FALSE Cefalothin Cefalotine Cefalotina Cefalotina Céphalothine Cephalothin Cephalothin Kefalotin Цефалотин
|
||||
Ce(f|ph)alexin TRUE TRUE TRUE FALSE Cefalexin Cefalexine Cefalexina Cephalexin Céphalexine Cephalexin Cephalexin Cephalexin Цефалексин
|
||||
Ce(f|ph)epime TRUE TRUE TRUE FALSE Cefepim Cefepim Cefepime Cephepime Céphépime Cephepime Cephepime Cephepim Цефепим
|
||||
Ce(f|ph)ixime TRUE TRUE TRUE FALSE Cefixim Cefixim Cefixima Cephixime Céphixime Cephixime Cephixim Cephixim Цефиксим
|
||||
Ce(f|ph)menoxime TRUE TRUE TRUE FALSE Cefmenoxim Cefmenoxim Cefmenoxima Cephmenoxime Céphénoxime Cephmenoxime Cephmenoxim Cephmenoxim Цефменоксим
|
||||
Ce(f|ph)metazole TRUE TRUE TRUE FALSE Cefmetazol Cefmetazol Cefmetazol Cephmetazole Céphmétazole Cefmetazole Cephmetazol Cephmetazol Цефметазол
|
||||
Ce(f|ph)odizime TRUE TRUE TRUE FALSE Cefodizim Cefodizim Cefodixima Cephodizime Céphodizime Cephodizime Cephodizim Cephodizim Цефодизим
|
||||
Ce(f|ph)onicid TRUE TRUE TRUE FALSE Cefonicid Cefonicide Cefonicida Cephonicid Céphonicide Cefonicid Cephonicid Cephonicid Цефонизид
|
||||
Ce(f|ph)operazone TRUE TRUE TRUE FALSE Cefoperazon Cefoperazon Cefoperazona Cephoperazone Céphopérazone Cephoperazone Cephoperazon Cephoperazon Цефоперазон
|
||||
Ce(f|ph)operazone/beta-lactamase inhibitor TRUE TRUE TRUE FALSE Cefoperazon/Beta-Lactamase-Hemmer Cefoperazon/enzymremmer Cefoperazona/inhib. de betalactamasas Cephoperazone/inib. d. beta-lattamasi Céphopérazone/inhib. de bêta-lactamase Cephoperazona/inibid. da beta-lactamase Cephoperazon/beta-lactamasehæmmer Cefoperazon/beta-laktamashämmare Цефоперазон/ингибитор бета-лактамаз
|
||||
Ce(f|ph)otaxime TRUE TRUE TRUE FALSE Cefotaxim Cefotaxim Cefotaxima Cephotaxime Céphotaxime Cephotaxime Cephotaxim Cephotaxim Цефотаксим
|
||||
Ce(f|ph)oxitin TRUE TRUE TRUE FALSE Cefoxitin Cefoxitine Cefoxitina Cefossitina Céphoxitine Cephoxitin Cephoxitin Cephoxitin Цефокситин
|
||||
Ce(f|ph)pirome TRUE TRUE TRUE FALSE Cefpirom Cefpirom Cephpirome Cephpirome Céphpirome Cefpirome Cephpirom Cephpirom Цефпиром
|
||||
Ce(f|ph)podoxime TRUE TRUE TRUE FALSE Cefpodoxim Cefpodoxim Cefpodoxima Cephpodoxime Céphpodoxime Cephpodoxime Cephpodoxim Cephpodoxim Цефподоксим
|
||||
Ce(f|ph)radine TRUE TRUE TRUE FALSE Cefradin Cefradine Cefradina Cefradina Céphradine Cephradine Cephradin Cephradin Цефрадин
|
||||
Ce(f|ph)sulodin TRUE TRUE TRUE FALSE Cefsulodin Cefsulodine Cefsulodina Cephsulodin Céphsulodine Cephsulodin Cephsulodin Cephsulodin Цефсулодин
|
||||
Ce(f|ph)tazidime TRUE TRUE TRUE FALSE Ceftazidim Ceftazidim Ceftazidima Ceftazidima Céphtazidime Ceftazidima Cephtazidim Cephtazidim Цефтазидим
|
||||
Ce(f|ph)tezole TRUE TRUE TRUE FALSE Ceftezol Ceftezol Ceftezol Cephtezole Céphtézole Ceftezole Cephtezol Cephtezole Цефтезол
|
||||
Ce(f|ph)tizoxime TRUE TRUE TRUE FALSE Ceftizoxim Ceftizoxim Ceftizoxima Cephtizoxime Céphtizoxime Cephtizoxime Cephtizoxim Cephtizoxim Цефтизоксим
|
||||
Ce(f|ph)triaxone TRUE TRUE TRUE FALSE Ceftriaxon Ceftriaxon Ceftriaxona Ceftriaxone Céphtriaxone Cefhtriaxone Cephtriaxon Ceftriaxon Цефтриаксон
|
||||
Ce(f|ph)uroxime TRUE TRUE TRUE FALSE Cefuroxim Cefuroxim Cefuroxima Cefuroxima Céphuroxime Cephuroxime Cephuroxim Cefuroxim Цефуроксим
|
||||
Ce(f|ph)uroxime/metronidazole TRUE TRUE TRUE FALSE Cefuroxim/Metronidazol Cefuroxim/andere antibacteriele middelen Cefuroxima/metronidazol Cefuroxima/metronidazolo Céphuroxime/métronidazole Cephuroxime/metronidazol Cefuroxim/metronidazol Cefuroxim/metronidazol Цефуроксим/метронидазол
|
||||
Chloramphenicol FALSE TRUE TRUE FALSE Chloramphenicol Chlooramfenicol Cloranfenicol Cloramfenicolo Chloramphénicol Cloranfenicol Kloramfenicol Kloramfenikol Хлорамфеникол
|
||||
Chlortetracycline FALSE TRUE TRUE FALSE Chlortetracyclin Chloortetracycline Clortetraciclina Clorotetraciclina Chlortétracycline Chlortetracycline Chlortetracyclin Klortetracyklin Хлортетрациклин
|
||||
Cinoxacin FALSE TRUE TRUE FALSE Cinoxacin Cinoxacine Cinoxacina Cinoxacina Cinoxacine Cinoxacin Cinoxacin Cinoxacin Циноксацин
|
||||
Ciprofloxacin FALSE TRUE TRUE FALSE Ciprofloxacin Ciprofloxacine Ciprofloxacina Ciprofloxacina Ciprofloxacine Ciprofloxacin Ciprofloxacin Ciprofloxacin Ципрофлоксацин
|
||||
Clarithromycin FALSE TRUE TRUE FALSE Clarithromycin Claritromycine Claritromicina Claritromicina Clarithromycine Claritromicina Clarithromycin Claritromycin Кларитромицин
|
||||
Clavulanic acid FALSE TRUE TRUE FALSE Clavulansäure Clavulaanzuur Ácido clavulánico Acido clavulanico Acide clavulanique Ácido clavulânico Clavulansyre Clavulansyra Клавулановая кислота
|
||||
clavulanic acid FALSE TRUE TRUE FALSE Clavulansäure clavulaanzuur ácido clavulánico acido clavulanico acide clavulanique ácido clavulânico clavulansyre clavulansyra клавулановая кислота
|
||||
Clindamycin FALSE TRUE TRUE FALSE Clindamycin Clindamycine Clindamicina Clindamicina Clindamycine Clindamicina Clindamycin Clindamycin Клиндамицин
|
||||
Clometocillin FALSE TRUE TRUE FALSE Clometocillin Clometocilline Clometocilina Clometocillina Clométocilline Clometocillin Clometocillin Klometocillin Клометоциллин
|
||||
Clotrimazole FALSE TRUE TRUE FALSE Clotrimazol Clotrimazol Clotrimazol Clotrimazolo Clotrimazole Clotrimazole Clotrimazol Klotrimazol Клотримазол
|
||||
Cloxacillin FALSE TRUE TRUE FALSE Cloxacillin Cloxacilline Cloxacilina Cloxacillina Cloxacilline Cloxacillin Cloxacillin Kloxacillin Клоксациллин
|
||||
Colistin FALSE TRUE TRUE FALSE Colistin Colistine Colistina Colistina Colistine Colistin Colistin Kolistin Колистин
|
||||
Dapsone FALSE TRUE TRUE FALSE Dapson Dapson Dapsona Dapsone Dapsone Dapsone Dapson Dapson Дапсон
|
||||
Daptomycin FALSE TRUE TRUE FALSE Daptomycin Daptomycine Daptomicina Daptomicina Daptomycine Daptomicina Daptomycin Daptomycin Даптомицин
|
||||
Dibekacin FALSE TRUE TRUE FALSE Dibekacin Dibekacine Dibekacina Dibekacin Dibekacine Dibekacin Dibekacin Dibekacin Дибекацин
|
||||
Dicloxacillin FALSE TRUE TRUE FALSE Dicloxacillin Dicloxacilline Dicloxacilina Dicloxacillina Dicloxacilline Dicloxacilina Dicloxacillin Dikloxacillin Диклоксациллин
|
||||
Dirithromycin FALSE TRUE TRUE FALSE Dirithromycin Diritromycine Diritromicina Diritromicina Dirithromycine Diritromicina Dirithromycin Diritromycin Диритромицин
|
||||
Econazole FALSE TRUE TRUE FALSE Econazol Econazol Econazol Econazolo Econazole Econazole Econazol Ekonazol Эконазол
|
||||
Enoxacin FALSE TRUE TRUE FALSE Enoxacin Enoxacine Enoxacina Enoxacina Enoxacine Enoxacin Enoxacin Enoxacin Эноксацин
|
||||
Epicillin FALSE TRUE TRUE FALSE Epicillin Epicilline Epicilina Epicillina Epicilline Epicilina Epicillin Epicillin Эпициллин
|
||||
Erythromycin FALSE TRUE TRUE FALSE Erythromycin Erytromycine Eritromicina Eritromicina Erythromycine Eritromicina Erythromycin Erytromycin Эритромицин
|
||||
Ethambutol/isoniazid FALSE TRUE TRUE FALSE Ethambutol/Isoniazid Ethambutol/isoniazide Etambutol/isoniazida Etambutolo/isoniazide Ethambutol/isoniazide Ethambutol/isoniazid Ethambutol/isoniazid Etambutol/isoniazid Этамбутол/изониазид
|
||||
Fleroxacin FALSE TRUE TRUE FALSE Fleroxacin Fleroxacine Fleroxacina Fleroxacina Fléroxacine Fleroxacina Fleroxacin Fleroxacin Флероксацин
|
||||
Flucloxacillin FALSE TRUE TRUE FALSE Flucloxacillin Flucloxacilline Flucloxacilina Flucloxacillina Flucloxacilline Flucloxacillin Flucloxacillin Flucloxacillin Флуклоксациллин
|
||||
Fluconazole FALSE TRUE TRUE FALSE Fluconazol Fluconazol Fluconazol Fluconazolo Fluconazole Fluconazole Fluconazol Flukonazol Флуконазол
|
||||
Flucytosine FALSE TRUE TRUE FALSE Flucytosin Fluorocytosine Flucitosina Flucytosine Flucytosine Flucytosine Flucytosin Flucytosin Флуцитозин
|
||||
Flurithromycin FALSE TRUE TRUE FALSE Flurithromycin Fluritromycine Fluritromicina Fluritromicina Flurithromycine Fluritromicina Flurithromycin Fluritromycin Флуритромицин
|
||||
Fosfomycin FALSE TRUE TRUE FALSE Fosfomycin Fosfomycine Fosfomicina Fosfomicina Fosfomycine Fosfomycin Fosfomycin Fosfomycin Фосфомицин
|
||||
Fusidic acid FALSE TRUE TRUE FALSE Fusidinsäure Fusidinezuur Ácido fusídico Acido fusidico Acide fusidique Ácido fusídico Fusidinsyre Fusidinsyra Фузидовая кислота
|
||||
Gatifloxacin FALSE TRUE TRUE FALSE Gatifloxacin Gatifloxacine Gatifloxacina Gatifloxacina Gatifloxacine Gatifloxacin Gatifloxacin Gatifloxacin Гатифлоксацин
|
||||
Gemifloxacin FALSE TRUE TRUE FALSE Gemifloxacin Gemifloxacine Gemifloxacina Gemifloxacina Gemifloxacine Gemifloxacin Gemifloxacin Gemifloxacin Гемифлоксацин
|
||||
Gentamicin FALSE TRUE TRUE FALSE Gentamicin Gentamicine Gentamicina Gentamicina Gentamicine Gentamicina Gentamicin Gentamicin Гентамицин
|
||||
Grepafloxacin FALSE TRUE TRUE FALSE Grepafloxacin Grepafloxacine Grepafloxacina Grepafloxacina Grepafloxacine Grepafloxacin Grepafloxacin Grepafloxacin Грепафлоксацин
|
||||
Hachimycin FALSE TRUE TRUE FALSE Hachimycin Hachimycine Hachimycin Hachimycin Hachimycine Hachimycin Hachimycin Hachimycin Хатимицин
|
||||
Hetacillin FALSE TRUE TRUE FALSE Hetacillin Hetacilline Hetacilina Hetacillin Hétacilline Hetacillin Hetacillin Hetacillin Гетациллин
|
||||
Imipenem/cilastatin FALSE TRUE TRUE FALSE Imipenem/Cilastatin Imipenem/enzymremmer Imipenem/cilastatina Imipenem/cilastatina Imipénème/cilastatine Imipenem/coteltelatina Imipenem/cilastatin Imipenem/cilastatin Имипенем/циластатин
|
||||
Inosine pranobex FALSE TRUE TRUE FALSE Inosin-Pranobex Inosiplex Inosina pranobex Inosina pranobex Inosine pranobex Pranobex inosine Inosin pranobex Inosin pranobex Инозин пранобекс
|
||||
Isepamicin FALSE TRUE TRUE FALSE Isepamicin Isepamicine Isepamicina Isepamicina Isepamicine Isepamicina Isepamicin Isepamicin Исепамицин
|
||||
Isoconazole FALSE TRUE TRUE FALSE Isoconazol Isoconazol Isoconazol Isoconazolo Isoconazole Isoconazole Isoconazol Isokonazol Изоконазол
|
||||
Isoniazid FALSE TRUE TRUE FALSE Isoniazid Isoniazide Isoniazida Isoniazide Isoniazide Isoniazid Isoniazid Isoniazid Изониазид
|
||||
Itraconazole FALSE TRUE TRUE FALSE Itraconazol Itraconazol Itraconazol Itraconazolo Itraconazole Itraconazole Itraconazol Itrakonazol Итраконазол
|
||||
Josamycin FALSE TRUE TRUE FALSE Josamycin Josamycine Josamicina Josamicina Josamycine Josamycin Josamycin Josamycin Джозамицин
|
||||
Kanamycin FALSE TRUE TRUE FALSE Kanamycin Kanamycine Kanamicina Kanamicina Kanamycine Kanamycin Kanamycin Kanamycin Канамицин
|
||||
Ketoconazole FALSE TRUE TRUE FALSE Ketoconazol Ketoconazol Ketoconazol Ketoconazolo Kétoconazole Ketoconazole Ketoconazol Ketokonazol Кетоконазол
|
||||
Levofloxacin FALSE TRUE TRUE FALSE Levofloxacin Levofloxacine Levofloxacina Levofloxacina Lévofloxacine Levofloxacin Levofloxacin Levofloxacin Левофлоксацин
|
||||
Lincomycin FALSE TRUE TRUE FALSE Lincomycin Lincomycine Lincomicina Lincomicina Lincomycine Lincomycin Lincomycin Lincomycin Линкомицин
|
||||
Lomefloxacin FALSE TRUE TRUE FALSE Lomefloxacin Lomefloxacine Lomefloxacina Lomefloxacina Loméfloxacine Lomefloxacin Lomefloxacin Lomefloxacin Ломефлоксацин
|
||||
Lysozyme FALSE TRUE TRUE FALSE Lysozym Lysozym Lisozima Lisozima Lysozyme Lysozyme Lysozym Lysozym Лизоцим
|
||||
Mandelic acid FALSE TRUE TRUE FALSE Mandelsäure Amandelzuur Ácido mandélico Acido mandelico Acide mandélique Ácido mandélico Mandelinsyre Mandelsyra Мандаловая кислота
|
||||
Metampicillin FALSE TRUE TRUE FALSE Metampicillin Metampicilline Metampicilina Metampicillina Métampicilline Metampicilina Metampicillin Metampicillin Метампициллин
|
||||
Meticillin FALSE TRUE TRUE FALSE Meticillin Meticilline Meticilina Meticillina Méticilline Meticillin Meticillin Meticillin Метициллин
|
||||
Metisazone FALSE TRUE TRUE FALSE Metisazon Metisazon Metisazona Metisazone Métisazone Metisazone Metisazon Metisazon Метисазон
|
||||
Metronidazole FALSE TRUE TRUE FALSE Metronidazol Metronidazol Metronidazol Metronidazolo Métronidazole Metronidazol Metronidazol Metronidazol Метронидазол
|
||||
Mezlocillin FALSE TRUE TRUE FALSE Mezlocillin Mezlocilline Mezlocilina Mezlocillina Mezlocilline Mezlocillin Mezlocillin Mezlocillin Мезлоциллин
|
||||
Micafungin FALSE TRUE TRUE FALSE Micafungin Micafungine Micafungina Micafungin Micafungine Micafungin Micafungin Micafungin Микафунгин
|
||||
Miconazole FALSE TRUE TRUE FALSE Miconazol Miconazol Miconazol Miconazolo Miconazole Miconazole Miconazol Miconazol Миконазол
|
||||
Midecamycin FALSE TRUE TRUE FALSE Midecamycin Midecamycine Midecamicina Midecamicina Midecamycine Midecamycin Midecamycin Midecamycin Мидекамицин
|
||||
Miocamycin FALSE TRUE TRUE FALSE Miocamycin Miocamycine Miocamycin Miocamicina Miocamycine Miocamicina Miocamycin Miocamycin Миокамицин
|
||||
Moxifloxacin FALSE TRUE TRUE FALSE Moxifloxacin Moxifloxacine Moxifloxacina Moxifloxacin Moxifloxacine Moxifloxacina Moxifloxacin Moxifloxacin Моксифлоксацин
|
||||
Mupirocin FALSE TRUE TRUE FALSE Mupirocin Mupirocine Mupirocina Mupirocina Mupirocine Mupirocina Mupirocin Mupirocin Мупироцин
|
||||
Nalidixic acid FALSE TRUE TRUE FALSE Nalidixinsäure Nalidixinezuur Ácido nalidíxico Acido nalidixico Acide nalidixique Ácido nalidíxico Nalidixinsyre Nalidixinsyra Налидиксовая кислота
|
||||
Neomycin FALSE TRUE TRUE FALSE Neomycin Neomycine Neomicina Neomicina Néomycine Neomicina Neomycin Neomycin Неомицин
|
||||
Netilmicin FALSE TRUE TRUE FALSE Netilmicin Netilmicine Netilmicina Netilmicin Netilmicine Netilmicin Netilmicin Netilmicin Нетилмицин
|
||||
Nitrofurantoin FALSE TRUE TRUE FALSE Nitrofurantoin Nitrofurantoine Nitrofurantoína Nitrofurantoina Nitrofurantoïne Nitrofurantoína Nitrofurantoin Nitrofurantoin Нитрофурантоин
|
||||
Norfloxacin FALSE TRUE TRUE FALSE Norfloxacin Norfloxacine Norfloxacina Norfloxacina Norfloxacine Norfloxacin Norfloxacin Norfloxacin Норфлоксацин
|
||||
Novobiocin FALSE TRUE TRUE FALSE Novobiocin Novobiocine Novobiocina Novobiocin Novobiocine Novobiocin Novobiocin Novobiocin Новобиоцин
|
||||
Nystatin FALSE TRUE TRUE FALSE Nystatin Nystatine Nistatina Nystatin Nystatine Nystatin Nystatin Nystatin Нистатин
|
||||
Ofloxacin FALSE TRUE TRUE FALSE Ofloxacin Ofloxacine Ofloxacina Ofloxacin Ofloxacine Ofloxacin Ofloxacin Ofloxacin Офлоксацин
|
||||
Oleandomycin FALSE TRUE TRUE FALSE Oleandomycin Oleandomycine Oleandomicina Oleandomicina Oleandomycine Oleandomicina Oleandomycin Oleandomycin Олеандомицин
|
||||
Ornidazole FALSE TRUE TRUE FALSE Ornidazol Ornidazol Ornidazol Ornidazolo Ornidazole Ornidazole Ornidazol Ornidazol Орнидазол
|
||||
Oxacillin FALSE TRUE TRUE FALSE Oxacillin Oxacilline Oxacilina Oxacillina Oxacilline Oxacillin Oxacillin Oxacillin Оксациллин
|
||||
Oxolinic acid FALSE TRUE TRUE FALSE Oxolinsäure Oxolinezuur Ácido oxolínico Acido ossolinico Acide oxolinique Ácido oxolínico Oxolinsyre Oxolinsyra Оксолиновая кислота
|
||||
Oxytetracycline FALSE TRUE TRUE FALSE Oxytetracyclin Oxytetracycline Oxitetraciclina Ossitetraciclina Oxytétracycline Oxitetraciclina Oxytetracyclin Oxytetracyklin Окситетрациклин
|
||||
Pazufloxacin FALSE TRUE TRUE FALSE Pazufloxacin Pazufloxacine Pazufloxacina Pazufloxacin Pazufloxacine Pazufloxacin Pazufloxacin Pazufloxacin Пазуфлоксацин
|
||||
Pefloxacin FALSE TRUE TRUE FALSE Pefloxacin Pefloxacine Pefloxacina Pefloxacina Péfloxacine Pefloxacin Pefloxacin Pefloxacin Пефлоксацин
|
||||
Penamecillin FALSE TRUE TRUE FALSE Penamecillin Penamecilline Penamecilina Penamecillina Pénamécilline Penamecilina Penamecillin Penamecillin Пенамециллин
|
||||
Penicillin FALSE TRUE TRUE FALSE Penicillin Penicilline Penicilina Penicillina Pénicilline Penicilina Penicillin Penicillin Пенициллин
|
||||
Pheneticillin FALSE TRUE TRUE FALSE Pheneticillin Feneticilline Feneticilina Feneticillina Phénéticilline Pheneticillin Pheneticillin Feneticillin Фенетициллин
|
||||
Phenoxymethylpenicillin FALSE TRUE TRUE FALSE Phenoxymethylpenicillin Fenoxymethylpenicilline Fenoximetilpenicilina Fenossimetilpenicillina Phénoxyméthylpénicilline Fenoximetilpenicilina Phenoxymethylpenicillin Fenoximetylpenicillin Феноксиметилпенициллин
|
||||
Pipemidic acid FALSE TRUE TRUE FALSE Pipemidinsäure Pipemidinezuur Ácido pipemídico Acido pipemidico Acide pipémidique Ácido pipemídico Pipemidinsyre Pipemidinsyra Пипемидовая кислота
|
||||
Piperacillin FALSE TRUE TRUE FALSE Piperacillin Piperacilline Piperacilina Piperacillina Pipéracilline Piperacilina Piperacillin Piperacillin Пиперациллин
|
||||
Piperacillin/beta-lactamase inhibitor FALSE TRUE TRUE FALSE Piperacillin/Beta-Lactamase-Hemmer Piperacilline/enzymremmer Piperacilina/inhib. de la beta-lactamasa Piperacillina/inib. d. beta-lattamasi Pipéracilline/inhib. de bêta-lactamase Piperacilina/inibid. da beta-lactamase Piperacillin/beta-lactamasehæmmer Piperacillin/betalaktamashämmare Пиперациллин/ингибитор бета-лактамазы
|
||||
Piromidic acid FALSE TRUE TRUE FALSE Piromidinsäure Piromidinezuur Ácido piromídico Acido piromidico Acide piromidique Ácido piromídico Piromidinsyre Piromidinsyra Пиромидовая кислота
|
||||
Pivampicillin FALSE TRUE TRUE FALSE Pivampicillin Pivampicilline Pivampicilina Pivampicillina Pivampicilline Pivampicilina Pivampicillin Pivampicillin Пивампициллин
|
||||
Polymyxin B FALSE TRUE TRUE FALSE Polymyxin B Polymyxine B Polimixina B Polimixina B Polymyxine B Polimixina B Polymyxin B Polymyxin B Полимиксин В
|
||||
Posaconazole FALSE TRUE TRUE FALSE Posaconazol Posaconazol Posaconazol Posaconazolo Posaconazole Posaconazole Posaconazol Posakonazol Посаконазол
|
||||
Pristinamycin FALSE TRUE TRUE FALSE Pristinamycin Pristinamycine Pristinamicina Pristinamicina Pristinamycine Pristinamicina Pristinamycin Pristinamycin Пристинамицин
|
||||
Procaine benzylpenicillin FALSE TRUE TRUE FALSE Procain-Benzylpenicillin Benzylpenicillineprocaine Bencilpenicilina procaína Procaina benzilpenicillina Procaïne benzylpénicilline Procaína benzilpenicilina Prokainbenzylpenicillin Prokainbenzylpenicillin Прокаин бензилпенициллин
|
||||
Propicillin FALSE TRUE TRUE FALSE Propicillin Propicilline Propicilina Propicillina Propicilline Propicilina Propicillin Propicillin Пропициллин
|
||||
Prulifloxacin FALSE TRUE TRUE FALSE Prulifloxacin Prulifloxacine Prulifloxacina Prulifloxacina Prulifloxacine Prulifloxacina Prulifloxacin Prulifloxacin Прулифлоксацин
|
||||
Quinupristin/dalfopristin FALSE TRUE TRUE FALSE Quinupristin/Dalfopristin Quinupristine/dalfopristine Quinupristina/dalfopristina Quinupristina/dalfopristina Quinupristine/dalfopristine Quinupristin/dalfopristin Quinupristin/dalfopristin Quinupristin/dalfopristin Квинупристин/дальфопристин
|
||||
Ribostamycin FALSE TRUE TRUE FALSE Ribostamycin Ribostamycine Ribostamicina Ribostamicina Ribostamycine Ribostamicina Ribostamycin Ribostamycin Рибостамицин
|
||||
Rifabutin FALSE TRUE TRUE FALSE Rifabutin Rifabutine Rifabutina Rifabutina Rifabutine Rifabutin Rifabutin Rifabutin Рифабутин
|
||||
Rifampicin FALSE TRUE TRUE FALSE Rifampicin Rifampicine Rifampicina Rifampicina Rifampicine Rifampicina Rifampicin Rifampicin Рифампицин
|
||||
Rifampicin/pyrazinamide/ethambutol/isoniazid FALSE TRUE TRUE FALSE Rifampicin/Pyrazinamid/Ethambutol/Isoniazid Rifampicine/pyrazinamide/ethambutol/isoniazide Rifampicina/pirazinamida/etambutol/isoniazida Rifampicina/pirazinamide/etambutolo/isoniazide Rifampicine/pyrazinamide/éthambutol/isoniazide Rifampicina/pirazinamida/etambutol/isoniazida Rifampicin/pyrazinamid/ethambutol/isoniazid Rifampicin/pyrazinamid/ethambutol/isoniazid Рифампицин/пиразинамид/этамбутол/исониазид
|
||||
Rifampicin/pyrazinamide/isoniazid FALSE TRUE TRUE FALSE Rifampicin/Pyrazinamid/Isoniazid Rifampicine/pyrazinamide/isoniazide Rifampicina/pirazinamida/isoniazida Rifampicina/pirazinamide/isoniazide Rifampicine/pyrazinamide/isoniazide Rifampicina/pirazinamida/isoniazida Rifampicin/pyrazinamid/isoniazid Rifampicin/pyrazinamid/isoniazid Рифампицин/пиразинамид/изониазид
|
||||
Rifampicin/isoniazid FALSE TRUE TRUE FALSE Rifampicin/Isoniazid Rifampicine/isoniazide Rifampicina/isoniazida Rifampicina/isoniazide Rifampicine/isoniazide Rifampicina/isoniazida Rifampicin/isoniazid Rifampicin/isoniazid Рифампицин/изониазид
|
||||
Rifamycin FALSE TRUE TRUE FALSE Rifamycin Rifamycine Rifamicina Rifamicina Rifamycine Rifamycin Rifamycin Rifamycin Рифамицин
|
||||
Rifaximin FALSE TRUE TRUE FALSE Rifaximin Rifaximine Rifaximina Rifaximina Rifaximine Rifaximin Rifaximin Rifaximin Рифаксимин
|
||||
Rokitamycin FALSE TRUE TRUE FALSE Rokitamycin Rokitamycine Rokitamicina Rokitamicina Rokitamycine Rokitamycin Rokitamycin Rokitamycin Рокитамицин
|
||||
Rosoxacin FALSE TRUE TRUE FALSE Rosoxacin Rosoxacine Rosoxacina Rosoxacina Rosoxacine Rosoxacina Rosoxacin Rosoxacin Розоксацин
|
||||
Roxithromycin FALSE TRUE TRUE FALSE Roxithromycin Roxitromycine Roxitromicina Roxitromicina Roxithromycine Roxitromicina Roxithromycin Roxitromycin Рокситромицин
|
||||
Rufloxacin FALSE TRUE TRUE FALSE Rufloxacin Rufloxacine Rufloxacina Rufloxacina Rufloxacine Rufloxacin Rufloxacin Rufloxacin Руфлоксацин
|
||||
Sisomicin FALSE TRUE TRUE FALSE Sisomicin Sisomicine Sisomicina Sisomicina Sisomicine Sisomicina Sisomicin Sisomicin Сизомицин
|
||||
Sodium aminosalicylate FALSE TRUE TRUE FALSE Natrium-Aminosalicylat Aminosalicylzuur Aminosalicilato de sodio Sodio aminosalicilato Aminosalicylate de sodium Aminosalicilato de sódio Natriumaminosalicylat Natriumaminosalicylat Аминосалицилат натрия
|
||||
Sparfloxacin FALSE TRUE TRUE FALSE Sparfloxacin Sparfloxacine Esparfloxacina Sparfloxacina Sparfloxacine Sparfloxacin Sparfloxacin Sparfloxacin Спарфлоксацин
|
||||
Spectinomycin FALSE TRUE TRUE FALSE Spectinomycin Spectinomycine Espectinomicina Spectinomycin Spectinomycine Spectinomycin Spectinomycin Spektinomycin Спектиномицин
|
||||
Spiramycin FALSE TRUE TRUE FALSE Spiramycin Spiramycine Espiramicina Spiramicina Spiramycine Spiramycin Spiramycin Spiramycin Спирамицин
|
||||
Spiramycin/metronidazole FALSE TRUE TRUE FALSE Spiramycin/Metronidazol Spiramycine/metronidazol Espiramicina/metronidazol Spiramicina/metronidazolo Spiramycine/métronidazole Spiramycin/metronidazol Spiramycin/metronidazol Spiramycin/metronidazol Спирамицин/метронидазол
|
||||
Staphylococcus immunoglobulin FALSE TRUE TRUE FALSE Staphylococcus-Immunoglobulin Stafylokokkenimmunoglobuline Inmunoglobulina estafilocócica Immunoglobulina per stafilococco Immunoglobuline staphylococcique Imunoglobulina de Staphylococcus Stafylokok-immunglobulin Immunoglobulin mot stafylokocker Стафилококковый иммуноглобулин
|
||||
Streptoduocin FALSE TRUE TRUE FALSE Streptoduocin Streptoduocine Estreptoduocina Streptoduocin Streptoduocine Estreptoduocina Streptoduocin Streptoduocin Стрептодуоцин
|
||||
Streptomycin FALSE TRUE TRUE FALSE Streptomycin Streptomycine Estreptomicina Streptomicina Streptomycine Streptomycin Streptomycin Streptomycin Стрептомицин
|
||||
Streptomycin/isoniazid FALSE TRUE TRUE FALSE Streptomycin/Isoniazid Streptomycine/isoniazide Estreptomicina/isoniazida Streptomicina/isoniazide Streptomycine/isoniazide Streptomicina/isoniazida Streptomycin/isoniazid Streptomycin/isoniazid Стрептомицин/изониазид
|
||||
Sulbenicillin FALSE TRUE TRUE FALSE Sulbenicillin Sulbenicilline Sulbenicilina Sulbenicillina Sulbenicilline Sulbenicilina Sulbenicillin Sulbenicillin Сульбенициллин
|
||||
Sulfadiazine/tetroxoprim FALSE TRUE TRUE FALSE Sulfadiazin/Tetroxoprim Sulfadiazine/tetroxoprim Sulfadiazina/tetroxoprim Sulfadiazina/tetroxoprim Sulfadiazine/tetroxoprime Sulfadiazina/tetroxoprim Sulfadiazin/tetroxoprim Sulfadiazin/tetroxoprim Сульфадиазин/тетроксоприм
|
||||
Sulfadiazine/trimethoprim FALSE TRUE TRUE FALSE Sulfadiazin/Trimethoprim Sulfadiazine/trimethoprim Sulfadiazina/trimetoprima Sulfadiazina/trimetoprim Sulfadiazine/triméthoprime Sulfadiazina/trimethoprim Sulfadiazin/trimethoprim Sulfadiazin/trimetoprim Сульфадиазин/триметоприм
|
||||
Sulfadimidine/trimethoprim FALSE TRUE TRUE FALSE Sulfadimidin/Trimethoprim Sulfadimidine/trimethoprim Sulfadimidina/trimetoprima Sulfadimidina/trimetoprim Sulfadimidine/triméthoprime Sulfadimidina/trimethoprim Sulfadimidin/trimethoprim Sulfadimidin/trimetoprim Сульфадимидин/триметоприм
|
||||
Sulfafurazole FALSE TRUE TRUE FALSE Sulfafurazol Sulfafurazol Sulfafurazol Sulfafurazolo Sulfafurazole Sulfafurazole Sulfafurazol Sulfafurazol Сульфафуразол
|
||||
Sulfaisodimidine FALSE TRUE TRUE FALSE Sulfaisodimidin Sulfisomidine Sulfaisodimidina Sulfaisodimidina Sulfaisodimidine Sulfaisodimidina Sulfaisodimidin Sulfaisodimidin Сульфаизодимидин
|
||||
Sulfalene FALSE TRUE TRUE FALSE Sulfalene Sulfaleen Sulfaleno Sulfalene Sulfalène Sulfaleno Sulfalen Sulfen Сульфален
|
||||
Sulfamazone FALSE TRUE TRUE FALSE Sulfamazon Sulfamazon Sulfamazona Sulfamazone Sulfamazone Sulfamazona Sulfamazon Sulfamazon Сульфамазон
|
||||
Sulfamerazine/trimethoprim FALSE TRUE TRUE FALSE Sulfamerazin/Trimethoprim Sulfamerazine/trimethoprim Sulfamerazina/trimetoprima Sulfamerazina/trimetoprim Sulfamérazine/triméthoprime Sulfamerazina/trimethoprim Sulfamerazin/trimethoprim Sulfamerazin/trimetoprim Сульфамеразин/триметоприм
|
||||
Sulfamethizole FALSE TRUE TRUE FALSE Sulfamethizol Sulfamethizol Sulfametozol Sulfamethizolo Sulfaméthizole Sulfametizole Sulfamethizol Sulfamethizol Сульфаметизол
|
||||
Sulfamethoxazole FALSE TRUE TRUE FALSE Sulfamethoxazol Sulfamethoxazol Sulfametoxazol Sulfametossazolo Sulfaméthoxazole Sulfamethoxazole Sulfamethoxazol Sulfametoxazol Сульфаметоксазол
|
||||
Sulfamethoxazole/trimethoprim FALSE TRUE TRUE FALSE Sulfamethoxazol/Trimethoprim Sulfamethoxazol/trimethoprim Sulfametoxazol/trimetoprima Sulfametossazolo/trimetoprim Sulfaméthoxazole/triméthoprime Sulfametoxazol/trimethoprim Sulfamethoxazol/trimethoprim Sulfametoxazol/trimetoprim Сульфаметоксазол/триметоприм
|
||||
Sulfametoxydiazine FALSE TRUE TRUE FALSE Sulfametoxydiazin Sulfamethoxydiazine Sulfametoxidiazina Sulfametoxydiazine Sulfamétoxydiazine Sulfametoxidiazina Sulfametoxydiazin Sulfametoxydiazin Сульфаметоксидиазин
|
||||
Sulfametrole/trimethoprim FALSE TRUE TRUE FALSE Sulfametrole/Trimethoprim Sulfametrol/trimethoprim Sulfametrol/trimetoprima Sulfametrole/trimetoprim Sulfamétrole/triméthoprime Sulfametrole/trimethoprim Sulfametrol/trimethoprim Sulfametrol/trimetoprim Сульфаметрол/триметоприм
|
||||
Sulfamoxole FALSE TRUE TRUE FALSE Sulfamoxol Sulfamoxol Sulfamoxole Sulfamoxolo Sulfamoxole Sulfamoxole Sulfamoxol Sulfamoxol Сульфамоксол
|
||||
Sulfamoxole/trimethoprim FALSE TRUE TRUE FALSE Sulfamoxol/Trimethoprim Sulfamoxol/trimethoprim Sulfamoxol/trimetoprima Sulfamoxolo/trimetoprim Sulfamoxole/triméthoprime Sulfamoxole/trimethoprim Sulfamoxol/trimethoprim Sulfamoxol/trimetoprim Сульфамоксол/триметоприм
|
||||
Sulfaperin FALSE TRUE TRUE FALSE Sulfaperin Sulfaperine Sulfametoxazol Sulfaperin Sulfapérine Sulfaperin Sulfaperin Sulfaperin Сульфаперин
|
||||
Sulfaphenazole FALSE TRUE TRUE FALSE Sulfaphenazol Sulfafenazol Sulfafenazol Sulfafenazolo Sulfaphénazole Sulfafenazol Sulfaphenazol Sulfafenazol Сульфафеназол
|
||||
Sulfathiazole FALSE TRUE TRUE FALSE Sulfathiazol Sulfathiazol Sulfatiazol Sulfathiazole Sulfathiazole Sulfatazol Sulfathiazol Sulfathiazol Сульфатиазол
|
||||
Sulfathiourea FALSE TRUE TRUE FALSE Sulfathioharnstoff Sulfathioureum Sulfathiourea Sulfathiourea Sulfathiourée Sulfathiourea Sulfathiourea Sulfatiourea Сульфатиомочевина
|
||||
Sultamicillin FALSE TRUE TRUE FALSE Sultamicillin Sultamicilline Sultamicilina Sultamicillina Sultamicilline Sultamicillin Sultamicillin Sultamicillin Сультамициллин
|
||||
Talampicillin FALSE TRUE TRUE FALSE Talampicillin Talampicilline Talampicilina Talampicillina Talampicilline Talampicilina Talampicillin Talampicillin Талампициллин
|
||||
Teicoplanin FALSE TRUE TRUE FALSE Teicoplanin Teicoplanine Teicoplanina Teicoplanina Teicoplanine Teicoplanin Teicoplanin Teicoplanin Тейкопланин
|
||||
Telithromycin FALSE TRUE TRUE FALSE Telithromycin Telitromycine Telitromicina Telitromicina Télithromycine Telitromicina Telithromycin Telitromycin Телитромицин
|
||||
Temafloxacin FALSE TRUE TRUE FALSE Temafloxacin Temafloxacine Temafloxacina Temafloxacina Temafloxacine Temafloxacin Temafloxacin Temafloxacin Темафлоксацин
|
||||
Temocillin FALSE TRUE TRUE FALSE Temocillin Temocilline Temocilina Temocillina Temocillin Temocillin Temocillin Temocillin Темоциллин
|
||||
Tenofovir disoproxil FALSE TRUE TRUE FALSE Tenofovir Disoproxil Tenofovir Tenofovir disoproxil Tenofovir disoproxil Tenofovir disoproxil Tenofovir disoproxil Tenofovir disoproxil Tenofovir disoproxil Тенофовир дизопроксил
|
||||
Terizidone FALSE TRUE TRUE FALSE Terizidon Terizidon Terizidona Terizidone Terizidone Terizidone Terizidon Terizidon Теризидон
|
||||
Thiamphenicol FALSE TRUE TRUE FALSE Thiamphenicol Thiamfenicol Tiamfenicol Tiamfenicolo Thiamphénicol Tiamfenicol Thiamphenicol Tiamfenikol Тиамфеникол
|
||||
Thioacetazone/isoniazid FALSE TRUE TRUE FALSE Thioacetazon/Isoniazid Thioacetazon/isoniazide Tioacetazona/isoniazida Tioacetazone/isoniazide Thioacétazone/isoniazide Thioacetazone/isoniazid Thioacetazon/isoniazid Thioacetazon/isoniazid Тиоацетазон/изониазид
|
||||
Ticarcillin FALSE TRUE TRUE FALSE Ticarcillin Ticarcilline Ticarcilina Ticarcillina Ticarcilline Ticarcilina Ticarcillin Ticarcillin Тикарциллин
|
||||
Ticarcillin/beta-lactamase inhibitor FALSE TRUE TRUE FALSE Ticarcillin/Beta-Lactamase-Hemmer Ticarcilline/enzymremmer Ticarcilina/inhib. de la betalactamasa Ticarcillina/inib. d. beta-lattamasi Ticarcilline/inhib. de bêta-lactamase Ticarcilina/inibid. da beta-lactamase Ticarcillin/beta-lactamasehæmmer Ticarcillin/beta-laktamashämmare Тикарциллин/ингибитор бета-лактамазы
|
||||
Ticarcillin/clavulanic acid FALSE TRUE TRUE FALSE Ticarcillin/Clavulansäure Ticarcilline/clavulaanzuur Ticarcilina/ácido clavulánico Ticarcillina/acido clavulanico Ticarcilline/acide clavulanique Ticarcilina/ácido clavulanico Ticarcillin/clavulansyre Ticarcillin/clavulansyra Тикарциллин/клавулановая кислота
|
||||
Tinidazole FALSE TRUE TRUE FALSE Tinidazol Tinidazol Tinidazol Tinidazolo Tinidazole Tinidazole Tinidazol Tinidazol Тинидазол
|
||||
Tobramycin FALSE TRUE TRUE FALSE Tobramycin Tobramycine Tobramicina Tobramicina Tobramycine Tobramycin Tobramycin Tobramycin Тобрамицин
|
||||
Trimethoprim/sulfamethoxazole FALSE TRUE TRUE FALSE Trimethoprim/Sulfamethoxazol Cotrimoxazol Trimetoprima/sulfametoxazol Trimetoprim/sulfametossazolo Triméthoprime/sulfaméthoxazole Trimethoprim/sulfametoxazol Trimethoprim/sulfamethoxazol Trimetoprim/sulfametoxazol Триметоприм/сульфаметоксазол
|
||||
Troleandomycin FALSE TRUE TRUE FALSE Troleandomycin Troleandomycine Troleandomicina Troleandomicina Troleandomycine Troleandomicina Troleandomycin Troleandomycin Тролеандомицин
|
||||
Trovafloxacin FALSE TRUE TRUE FALSE Trovafloxacin Trovafloxacine Trovafloxacina Trovafloxacin Trovafloxacine Trovafloxacin Trovafloxacin Trovafloxacin Тровафлоксацин
|
||||
Vancomycin FALSE TRUE TRUE FALSE Vancomycin Vancomycine Vancomicina Vancomicina Vancomycine Vancomycin Vancomycin Vancomycin Ванкомицин
|
||||
Voriconazole FALSE TRUE TRUE FALSE Voriconazol Voriconazol Voriconazol Voriconazolo Voriconazole Voriconazol Voriconazol Vorikonazol Вориконазол
|
||||
Aminoglycosides FALSE TRUE TRUE FALSE Aminoglykoside Aminoglycosiden Aminoglucósidos Aminoglicosidi Aminoglycosides Aminoglycosides Aminoglykosider Aminoglykosider Аминогликозиды
|
||||
Amphenicols FALSE TRUE TRUE FALSE Amphenicole Amfenicolen Anfenicoles Amphenicols Amphénicols Anfenicóis Amphenicoler Amfenikoler Амфениколы
|
||||
Antifungals/antimycotics FALSE TRUE TRUE FALSE Antimykotika/Antimykotika Antifungica/antimycotica Antifúngicos/antimicóticos Antifungini/antimicotici Antifongiques/antimycotiques Antifúngicos/antimicóticos Antimykotika/antimykotika Antimykotika/antimykotika Противогрибковые препараты/антимикотики
|
||||
Antimycobacterials FALSE TRUE TRUE FALSE Antimykobakterielle Mittel Antimycobacteriele middelen Antimicrobianos Antimicobatterici Antimycobactériens Antimycobacterials Antimycobakterier Antimykobakterier Антимикобактериальные препараты
|
||||
Beta-lactams/penicillins FALSE TRUE TRUE FALSE Beta-Lactame/Penicilline Beta-lactams/penicillines Beta-lactámicos/penicilinas Beta-lattami/penicilline Bêta-lactamines/pénicillines Beta-lactâmicas/penicilinas Beta-lactamer/penicilliner Beta-laktamer/penicilliner Бета-лактамы/пенициллины
|
||||
Cephalosporins (1st gen.) FALSE TRUE TRUE FALSE Cephalosporine (1. Gen.) Cefalosporines (1e gen.) Cefalosporinas (1er gen.) Cefalosporine (1° gen.) Céphalosporines (1ère génération) Cefalosporinas (1º género) Cefalosporiner (1. gen.) Kefalosporiner (första gen.) Цефалоспорины (1-го пок.)
|
||||
Cephalosporins (2nd gen.) FALSE TRUE TRUE FALSE Cephalosporine (2. Gen.) Cefalosporines (2e gen.) Cefalosporinas (2do gen.) Cefalosporine (2° gen.) Céphalosporines (2ème génération) Cefalosporinas (2ª gen.) Cefalosporiner (2. gen.) Kefalosporiner (andra gen.) Цефалоспорины (2-го пок.)
|
||||
Cephalosporins (3rd gen.) FALSE TRUE TRUE FALSE Cephalosporine (3. Gen.) Cefalosporines (3e gen.) Cefalosporinas (3er gen.) Cefalosporine (3° gen.) Céphalosporines (3ème génération) Cefalosporinas (3ª gen.) Cefalosporiner (3. gen.) Kefalosporiner (tredje gen.) Цефалоспорины (3-го пок.)
|
||||
Cephalosporins (4th gen.) FALSE TRUE TRUE FALSE Cephalosporine (4. Gen.) Cefalosporines (4e gen.) Cefalosporinas (4ª gen.) Cefalosporine (4° gen.) Céphalosporines (4ème génération) Cefalosporinas (4.ª gen.) Cefalosporiner (4. gen.) Kefalosporiner (4:e gen.) Цефалоспорины (4-го пок.)
|
||||
Cephalosporins (5th gen.) FALSE TRUE TRUE FALSE Cephalosporine (5. Gen.) Cefalosporines (5e gen.) Cefalosporinas (5º gen.) Cefalosporine (5° gen.) Céphalosporines (5e gén.) Cefalosporinas (5.ª gen.) Cefalosporiner (5. gen.) Kefalosporiner (5:e gen.) Цефалоспорины (5-го пок.)
|
||||
Cephalosporins (unclassified gen.) FALSE TRUE TRUE FALSE Cephalosporine (unklassifiziert) Cefalosporines (ongeclassificeerd) Cefalosporinas (gen. no clasificado) Cefalosporine (gen. non classificato) Céphalosporines (genre non classifié) Cefalosporinas (não classificado gen.) Cefalosporiner (uklassificeret gen.) Kefalosporiner (oklassificerad gen.) Цефалоспорины (неклассифицированный род)
|
||||
Cephalosporins FALSE TRUE TRUE FALSE Cephalosporine Cefalosporines Cefalosporinas Cefalosporine Céphalosporines Cefalosporinas Cefalosporiner Kefalosporiner Цефалоспорины
|
||||
Glycopeptides FALSE TRUE TRUE FALSE Glykopeptide Glycopeptiden Glicopéptidos Glicopeptidi Glycopeptides Glycopeptides Glykopeptider Glykopeptider Гликопептиды
|
||||
Macrolides/lincosamides FALSE TRUE TRUE FALSE Makrolide/Linkosamide Macroliden/lincosamiden Macrólidos/lincosamidas Macrolidi/lincosamidi Macrolides/lincosamides Macrolides/lincosamidas Makrolider/lincosamider Makrolider/linkosamider Макролиды/линкозамиды
|
||||
Other antibacterials FALSE TRUE TRUE FALSE Andere Antibiotika Overige antibiotica Otros antibacterianos Altri antibatterici Autres antibactériens Outros antibacterianos Andre antibakterielle stoffer Andra antibakteriella medel Другие антибактериальные препараты
|
||||
Polymyxins FALSE TRUE TRUE FALSE Polymyxine Polymyxines Polimixinas Polimixine Polymyxines Polimixinas Polymyxiner Polymyxiner Полимиксины
|
||||
Quinolones FALSE TRUE TRUE FALSE Quinolone Quinolonen Quinolonas Chinoloni Quinolones Quinolones Kinoloner Kinoloner Хинолоны
|
||||
|
|
@ -19,7 +19,7 @@
|
||||
<!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="https://msberends.github.io/AMR/pkgdown.css" rel="stylesheet">
|
||||
<script src="https://msberends.github.io/AMR/pkgdown.js"></script><link href="https://msberends.github.io/AMR/extra.css" rel="stylesheet">
|
||||
<script src="https://msberends.github.io/AMR/extra.js"></script><meta property="og:title" content="Page not found (404)">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -43,7 +43,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="https://msberends.github.io/AMR/index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9064</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9069</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
BIN
docs/AMR_intro.png
Normal file
After Width: | Height: | Size: 125 KiB |
1
docs/AMR_intro.svg
Normal file
After Width: | Height: | Size: 245 KiB |
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>License • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="bootstrap-toc.css"><script src="bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="pkgdown.css" rel="stylesheet"><script src="pkgdown.js"></script><link href="extra.css" rel="stylesheet"><script src="extra.js"></script><meta property="og:title" content="License"><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>License • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="bootstrap-toc.css"><script src="bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="pkgdown.css" rel="stylesheet"><script src="pkgdown.js"></script><link href="extra.css" rel="stylesheet"><script src="extra.js"></script><meta property="og:title" content="License"><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9064</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9069</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
BIN
docs/android-chrome-192x192.png
Normal file
After Width: | Height: | Size: 15 KiB |
BIN
docs/android-chrome-512x512.png
Normal file
After Width: | Height: | Size: 56 KiB |
Before Width: | Height: | Size: 7.4 KiB After Width: | Height: | Size: 6.2 KiB |
Before Width: | Height: | Size: 10 KiB After Width: | Height: | Size: 8.0 KiB |
Before Width: | Height: | Size: 12 KiB After Width: | Height: | Size: 9.7 KiB |
Before Width: | Height: | Size: 3.5 KiB After Width: | Height: | Size: 2.9 KiB |
Before Width: | Height: | Size: 4.6 KiB After Width: | Height: | Size: 3.6 KiB |
Before Width: | Height: | Size: 12 KiB After Width: | Height: | Size: 9.7 KiB |
Before Width: | Height: | Size: 40 KiB After Width: | Height: | Size: 40 KiB |
Before Width: | Height: | Size: 51 KiB After Width: | Height: | Size: 50 KiB |
Before Width: | Height: | Size: 30 KiB After Width: | Height: | Size: 30 KiB |
Before Width: | Height: | Size: 38 KiB After Width: | Height: | Size: 34 KiB |
Before Width: | Height: | Size: 40 KiB After Width: | Height: | Size: 39 KiB |
Before Width: | Height: | Size: 51 KiB After Width: | Height: | Size: 51 KiB |
Before Width: | Height: | Size: 38 KiB After Width: | Height: | Size: 38 KiB |
Before Width: | Height: | Size: 27 KiB After Width: | Height: | Size: 27 KiB |
Before Width: | Height: | Size: 69 KiB After Width: | Height: | Size: 69 KiB |
Before Width: | Height: | Size: 46 KiB After Width: | Height: | Size: 46 KiB |
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="How to apply EUCAST rules">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="How to determine multi-drug resistance (MDR)">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
@ -358,16 +358,16 @@ Unique: 2</p>
|
||||
<div class="sourceCode" id="cb8"><pre class="downlit sourceCode r">
|
||||
<code class="sourceCode R"><span class="fu"><a href="https://rdrr.io/r/utils/head.html" class="external-link">head</a></span><span class="op">(</span><span class="va">my_TB_data</span><span class="op">)</span>
|
||||
<span class="co"># rifampicin isoniazid gatifloxacin ethambutol pyrazinamide moxifloxacin</span>
|
||||
<span class="co"># 1 R I I R I I</span>
|
||||
<span class="co"># 2 S S S S I S</span>
|
||||
<span class="co"># 3 S I I S S I</span>
|
||||
<span class="co"># 4 R I S R R R</span>
|
||||
<span class="co"># 5 R S R R I I</span>
|
||||
<span class="co"># 6 I S R S I S</span>
|
||||
<span class="co"># 1 R R I S I I</span>
|
||||
<span class="co"># 2 I I I I R S</span>
|
||||
<span class="co"># 3 I R S I R S</span>
|
||||
<span class="co"># 4 R S I I I R</span>
|
||||
<span class="co"># 5 S S R I I S</span>
|
||||
<span class="co"># 6 R R R I S R</span>
|
||||
<span class="co"># kanamycin</span>
|
||||
<span class="co"># 1 I</span>
|
||||
<span class="co"># 2 I</span>
|
||||
<span class="co"># 3 R</span>
|
||||
<span class="co"># 2 R</span>
|
||||
<span class="co"># 3 S</span>
|
||||
<span class="co"># 4 R</span>
|
||||
<span class="co"># 5 R</span>
|
||||
<span class="co"># 6 R</span></code></pre></div>
|
||||
@ -413,32 +413,32 @@ Unique: 5</p>
|
||||
<tr class="odd">
|
||||
<td align="left">1</td>
|
||||
<td align="left">Mono-resistant</td>
|
||||
<td align="right">3230</td>
|
||||
<td align="right">64.60%</td>
|
||||
<td align="right">3230</td>
|
||||
<td align="right">64.60%</td>
|
||||
<td align="right">3246</td>
|
||||
<td align="right">64.92%</td>
|
||||
<td align="right">3246</td>
|
||||
<td align="right">64.92%</td>
|
||||
</tr>
|
||||
<tr class="even">
|
||||
<td align="left">2</td>
|
||||
<td align="left">Negative</td>
|
||||
<td align="right">984</td>
|
||||
<td align="right">19.68%</td>
|
||||
<td align="right">4214</td>
|
||||
<td align="right">84.28%</td>
|
||||
<td align="right">999</td>
|
||||
<td align="right">19.98%</td>
|
||||
<td align="right">4245</td>
|
||||
<td align="right">84.90%</td>
|
||||
</tr>
|
||||
<tr class="odd">
|
||||
<td align="left">3</td>
|
||||
<td align="left">Multi-drug-resistant</td>
|
||||
<td align="right">445</td>
|
||||
<td align="right">8.90%</td>
|
||||
<td align="right">4659</td>
|
||||
<td align="right">93.18%</td>
|
||||
<td align="right">437</td>
|
||||
<td align="right">8.74%</td>
|
||||
<td align="right">4682</td>
|
||||
<td align="right">93.64%</td>
|
||||
</tr>
|
||||
<tr class="even">
|
||||
<td align="left">4</td>
|
||||
<td align="left">Poly-resistant</td>
|
||||
<td align="right">241</td>
|
||||
<td align="right">4.82%</td>
|
||||
<td align="right">218</td>
|
||||
<td align="right">4.36%</td>
|
||||
<td align="right">4900</td>
|
||||
<td align="right">98.00%</td>
|
||||
</tr>
|
||||
|
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="How to conduct principal component analysis (PCA) for AMR">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="How to import data from SPSS / SAS / Stata">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9064</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
@ -191,7 +191,7 @@
|
||||
<h1 data-toc-skip>How to import data from SPSS / SAS / Stata</h1>
|
||||
<h4 data-toc-skip class="author">Dr. Matthijs Berends</h4>
|
||||
|
||||
<h4 data-toc-skip class="date">11 December 2021</h4>
|
||||
<h4 data-toc-skip class="date">12 December 2021</h4>
|
||||
|
||||
<small class="dont-index">Source: <a href="https://github.com/msberends/AMR/blob/HEAD/vignettes/SPSS.Rmd" class="external-link"><code>vignettes/SPSS.Rmd</code></a></small>
|
||||
<div class="hidden name"><code>SPSS.Rmd</code></div>
|
||||
|
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="How to work with WHONET data">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="Benchmarks">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
@ -224,19 +224,19 @@
|
||||
times <span class="op">=</span> <span class="fl">25</span><span class="op">)</span>
|
||||
<span class="fu"><a href="https://docs.ropensci.org/skimr/reference/print.html" class="external-link">print</a></span><span class="op">(</span><span class="va">S.aureus</span>, unit <span class="op">=</span> <span class="st">"ms"</span>, signif <span class="op">=</span> <span class="fl">2</span><span class="op">)</span>
|
||||
<span class="co"># Unit: milliseconds</span>
|
||||
<span class="co"># expr min lq mean median uq max neval</span>
|
||||
<span class="co"># as.mo("sau") 12.0 13 18.0 14.0 15.0 45.0 25</span>
|
||||
<span class="co"># as.mo("stau") 55.0 61 79.0 87.0 91.0 99.0 25</span>
|
||||
<span class="co"># as.mo("STAU") 55.0 58 71.0 61.0 91.0 100.0 25</span>
|
||||
<span class="co"># as.mo("staaur") 11.0 12 20.0 14.0 25.0 46.0 25</span>
|
||||
<span class="co"># as.mo("STAAUR") 12.0 12 13.0 13.0 14.0 15.0 25</span>
|
||||
<span class="co"># as.mo("S. aureus") 27.0 30 43.0 34.0 58.0 62.0 25</span>
|
||||
<span class="co"># as.mo("S aureus") 26.0 28 43.0 32.0 59.0 66.0 25</span>
|
||||
<span class="co"># as.mo("Staphylococcus aureus") 3.7 4 4.3 4.1 4.6 5.3 25</span>
|
||||
<span class="co"># as.mo("Staphylococcus aureus (MRSA)") 250.0 250 280.0 280.0 290.0 390.0 25</span>
|
||||
<span class="co"># as.mo("Sthafilokkockus aaureuz") 190.0 200 210.0 210.0 220.0 230.0 25</span>
|
||||
<span class="co"># as.mo("MRSA") 10.0 12 18.0 14.0 14.0 43.0 25</span>
|
||||
<span class="co"># as.mo("VISA") 19.0 22 29.0 24.0 26.0 55.0 25</span></code></pre></div>
|
||||
<span class="co"># expr min lq mean median uq max neval</span>
|
||||
<span class="co"># as.mo("sau") 12.0 14.0 24.0 15.0 42 64 25</span>
|
||||
<span class="co"># as.mo("stau") 49.0 62.0 79.0 77.0 98 120 25</span>
|
||||
<span class="co"># as.mo("STAU") 53.0 59.0 76.0 66.0 92 120 25</span>
|
||||
<span class="co"># as.mo("staaur") 12.0 14.0 19.0 15.0 17 53 25</span>
|
||||
<span class="co"># as.mo("STAAUR") 12.0 13.0 18.0 14.0 16 54 25</span>
|
||||
<span class="co"># as.mo("S. aureus") 27.0 32.0 41.0 33.0 39 79 25</span>
|
||||
<span class="co"># as.mo("S aureus") 26.0 31.0 45.0 34.0 67 79 25</span>
|
||||
<span class="co"># as.mo("Staphylococcus aureus") 3.7 4.4 8.8 4.7 5 45 25</span>
|
||||
<span class="co"># as.mo("Staphylococcus aureus (MRSA)") 250.0 260.0 280.0 280.0 300 330 25</span>
|
||||
<span class="co"># as.mo("Sthafilokkockus aaureuz") 170.0 200.0 230.0 220.0 240 330 25</span>
|
||||
<span class="co"># as.mo("MRSA") 12.0 13.0 18.0 15.0 16 53 25</span>
|
||||
<span class="co"># as.mo("VISA") 21.0 26.0 44.0 33.0 62 78 25</span></code></pre></div>
|
||||
<p><img src="benchmarks_files/figure-html/unnamed-chunk-4-1.png" width="750"></p>
|
||||
<p>In the table above, all measurements are shown in milliseconds (thousands of seconds). A value of 5 milliseconds means it can determine 200 input values per second. It case of 200 milliseconds, this is only 5 input values per second. It is clear that accepted taxonomic names are extremely fast, but some variations are up to 200 times slower to determine.</p>
|
||||
<p>To improve performance, we implemented two important algorithms to save unnecessary calculations: <strong>repetitive results</strong> and <strong>already precalculated results</strong>.</p>
|
||||
@ -258,8 +258,8 @@
|
||||
<span class="co"># what do these values look like? They are of class <mo>:</span>
|
||||
<span class="fu"><a href="https://rdrr.io/r/utils/head.html" class="external-link">head</a></span><span class="op">(</span><span class="va">x</span><span class="op">)</span>
|
||||
<span class="co"># Class <mo></span>
|
||||
<span class="co"># [1] B_STPHY_CONS B_STPHY_EPDR B_STPHY_CONS B_STRPT_PNMN B_STRPT_EQNS</span>
|
||||
<span class="co"># [6] B_STPHY_AURS</span>
|
||||
<span class="co"># [1] B_STPHY_EPDR B_STRPT_GRPA B_STPHY_AURS F_CANDD_GLBR F_CANDD </span>
|
||||
<span class="co"># [6] B_STRPT_ANGN</span>
|
||||
|
||||
<span class="co"># as the example_isolates data set has 2,000 rows, we should have 2 million items</span>
|
||||
<span class="fu"><a href="https://rdrr.io/r/base/length.html" class="external-link">length</a></span><span class="op">(</span><span class="va">x</span><span class="op">)</span>
|
||||
@ -275,8 +275,8 @@
|
||||
<span class="fu"><a href="https://docs.ropensci.org/skimr/reference/print.html" class="external-link">print</a></span><span class="op">(</span><span class="va">run_it</span>, unit <span class="op">=</span> <span class="st">"ms"</span>, signif <span class="op">=</span> <span class="fl">3</span><span class="op">)</span>
|
||||
<span class="co"># Unit: milliseconds</span>
|
||||
<span class="co"># expr min lq mean median uq max neval</span>
|
||||
<span class="co"># mo_name(x) 190 204 271 259 346 372 10</span></code></pre></div>
|
||||
<p>So getting official taxonomic names of 2,000,000 (!!) items consisting of 90 unique values only takes 0.259 seconds. That is 130 nanoseconds on average. You only lose time on your unique input values.</p>
|
||||
<span class="co"># mo_name(x) 232 245 327 353 384 449 10</span></code></pre></div>
|
||||
<p>So getting official taxonomic names of 2,000,000 (!!) items consisting of 90 unique values only takes 0.353 seconds. That is 177 nanoseconds on average. You only lose time on your unique input values.</p>
|
||||
</div>
|
||||
<div class="section level3">
|
||||
<h3 id="precalculated-results">Precalculated results<a class="anchor" aria-label="anchor" href="#precalculated-results"></a>
|
||||
@ -289,11 +289,11 @@
|
||||
times <span class="op">=</span> <span class="fl">10</span><span class="op">)</span>
|
||||
<span class="fu"><a href="https://docs.ropensci.org/skimr/reference/print.html" class="external-link">print</a></span><span class="op">(</span><span class="va">run_it</span>, unit <span class="op">=</span> <span class="st">"ms"</span>, signif <span class="op">=</span> <span class="fl">3</span><span class="op">)</span>
|
||||
<span class="co"># Unit: milliseconds</span>
|
||||
<span class="co"># expr min lq mean median uq max neval</span>
|
||||
<span class="co"># A 8.16 8.77 9.77 10.10 10.60 10.90 10</span>
|
||||
<span class="co"># B 23.20 26.60 32.00 27.50 28.90 76.30 10</span>
|
||||
<span class="co"># C 2.01 2.24 2.44 2.44 2.67 2.91 10</span></code></pre></div>
|
||||
<p>So going from <code>mo_name("Staphylococcus aureus")</code> to <code>"Staphylococcus aureus"</code> takes 0.0024 seconds - it doesn’t even start calculating <em>if the result would be the same as the expected resulting value</em>. That goes for all helper functions:</p>
|
||||
<span class="co"># expr min lq mean median uq max neval</span>
|
||||
<span class="co"># A 8.02 9.04 9.19 9.33 9.65 10.0 10</span>
|
||||
<span class="co"># B 24.00 26.60 33.10 27.50 27.80 78.7 10</span>
|
||||
<span class="co"># C 2.20 2.41 7.64 2.57 2.66 53.6 10</span></code></pre></div>
|
||||
<p>So going from <code>mo_name("Staphylococcus aureus")</code> to <code>"Staphylococcus aureus"</code> takes 0.0026 seconds - it doesn’t even start calculating <em>if the result would be the same as the expected resulting value</em>. That goes for all helper functions:</p>
|
||||
<div class="sourceCode" id="cb5"><pre class="downlit sourceCode r">
|
||||
<code class="sourceCode R"><span class="va">run_it</span> <span class="op"><-</span> <span class="fu"><a href="https://rdrr.io/pkg/microbenchmark/man/microbenchmark.html" class="external-link">microbenchmark</a></span><span class="op">(</span>A <span class="op">=</span> <span class="fu"><a href="../reference/mo_property.html">mo_species</a></span><span class="op">(</span><span class="st">"aureus"</span><span class="op">)</span>,
|
||||
B <span class="op">=</span> <span class="fu"><a href="../reference/mo_property.html">mo_genus</a></span><span class="op">(</span><span class="st">"Staphylococcus"</span><span class="op">)</span>,
|
||||
@ -307,14 +307,14 @@
|
||||
<span class="fu"><a href="https://docs.ropensci.org/skimr/reference/print.html" class="external-link">print</a></span><span class="op">(</span><span class="va">run_it</span>, unit <span class="op">=</span> <span class="st">"ms"</span>, signif <span class="op">=</span> <span class="fl">3</span><span class="op">)</span>
|
||||
<span class="co"># Unit: milliseconds</span>
|
||||
<span class="co"># expr min lq mean median uq max neval</span>
|
||||
<span class="co"># A 1.57 1.61 1.69 1.65 1.77 1.91 10</span>
|
||||
<span class="co"># B 1.54 1.59 1.73 1.64 1.84 2.19 10</span>
|
||||
<span class="co"># C 1.56 1.63 1.76 1.75 1.77 2.11 10</span>
|
||||
<span class="co"># D 1.58 1.59 1.73 1.65 1.66 2.62 10</span>
|
||||
<span class="co"># E 1.55 1.62 1.70 1.66 1.72 2.13 10</span>
|
||||
<span class="co"># F 1.58 1.62 1.81 1.72 1.81 2.61 10</span>
|
||||
<span class="co"># G 1.54 1.65 1.73 1.69 1.71 2.32 10</span>
|
||||
<span class="co"># H 1.58 1.65 1.80 1.74 1.84 2.24 10</span></code></pre></div>
|
||||
<span class="co"># A 1.52 1.69 2.40 1.92 3.43 4.28 10</span>
|
||||
<span class="co"># B 1.37 1.39 1.83 1.70 1.74 3.61 10</span>
|
||||
<span class="co"># C 1.41 1.72 2.17 2.00 2.51 3.34 10</span>
|
||||
<span class="co"># D 1.39 1.43 1.63 1.61 1.73 2.10 10</span>
|
||||
<span class="co"># E 1.40 1.71 1.82 1.75 2.13 2.26 10</span>
|
||||
<span class="co"># F 1.36 1.40 1.70 1.66 1.93 2.27 10</span>
|
||||
<span class="co"># G 1.38 1.68 2.32 1.71 3.56 4.41 10</span>
|
||||
<span class="co"># H 1.36 1.64 2.06 1.69 2.25 3.59 10</span></code></pre></div>
|
||||
<p>Of course, when running <code>mo_phylum("Firmicutes")</code> the function has zero knowledge about the actual microorganism, namely <em>S. aureus</em>. But since the result would be <code>"Firmicutes"</code> anyway, there is no point in calculating the result. And because this package contains all phyla of all known bacteria, it can just return the initial value immediately.</p>
|
||||
</div>
|
||||
<div class="section level3">
|
||||
@ -342,13 +342,13 @@
|
||||
<span class="fu"><a href="https://docs.ropensci.org/skimr/reference/print.html" class="external-link">print</a></span><span class="op">(</span><span class="va">run_it</span>, unit <span class="op">=</span> <span class="st">"ms"</span>, signif <span class="op">=</span> <span class="fl">4</span><span class="op">)</span>
|
||||
<span class="co"># Unit: milliseconds</span>
|
||||
<span class="co"># expr min lq mean median uq max neval</span>
|
||||
<span class="co"># en 19.38 19.92 23.08 20.50 21.40 67.58 100</span>
|
||||
<span class="co"># de 30.74 31.50 39.35 32.08 33.43 201.20 100</span>
|
||||
<span class="co"># nl 34.89 35.54 43.82 36.15 37.79 86.27 100</span>
|
||||
<span class="co"># es 34.62 35.30 42.36 35.99 37.61 90.39 100</span>
|
||||
<span class="co"># it 33.42 34.36 41.50 35.13 36.40 84.45 100</span>
|
||||
<span class="co"># fr 32.86 33.35 38.69 34.20 35.26 82.96 100</span>
|
||||
<span class="co"># pt 30.76 31.42 37.89 32.17 33.33 84.66 100</span></code></pre></div>
|
||||
<span class="co"># en 18.80 19.08 23.94 19.62 21.69 83.41 100</span>
|
||||
<span class="co"># de 30.37 30.79 39.01 31.75 35.07 112.40 100</span>
|
||||
<span class="co"># nl 34.35 34.94 46.21 35.95 43.04 100.30 100</span>
|
||||
<span class="co"># es 34.10 34.71 43.74 35.44 39.66 101.60 100</span>
|
||||
<span class="co"># it 32.91 33.42 41.19 34.04 36.24 101.50 100</span>
|
||||
<span class="co"># fr 32.18 32.87 42.84 33.76 40.21 92.48 100</span>
|
||||
<span class="co"># pt 30.11 30.78 38.80 31.33 34.45 99.76 100</span></code></pre></div>
|
||||
<p>Currently supported non-English languages are German, Dutch, Spanish, Italian, French and Portuguese.</p>
|
||||
</div>
|
||||
</div>
|
||||
|
Before Width: | Height: | Size: 82 KiB After Width: | Height: | Size: 83 KiB |
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="Data sets for download / own use">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9066</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9069</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
@ -190,7 +190,7 @@
|
||||
<div class="page-header toc-ignore">
|
||||
<h1 data-toc-skip>Data sets for download / own use</h1>
|
||||
|
||||
<h4 data-toc-skip class="date">11 December 2021</h4>
|
||||
<h4 data-toc-skip class="date">12 December 2021</h4>
|
||||
|
||||
<small class="dont-index">Source: <a href="https://github.com/msberends/AMR/blob/HEAD/vignettes/datasets.Rmd" class="external-link"><code>vignettes/datasets.Rmd</code></a></small>
|
||||
<div class="hidden name"><code>datasets.Rmd</code></div>
|
||||
@ -790,7 +790,7 @@ If you are reading this page from within R, please <a href="https://msberends.gi
|
||||
</h2>
|
||||
<p>A data set with 134,956 rows and 2 columns, containing the following column names:<br><em>microorganism</em> and <em>antibiotic</em>.</p>
|
||||
<p>This data set is in R available as <code>intrinsic_resistant</code>, after you load the <code>AMR</code> package.</p>
|
||||
<p>It was last updated on 11 December 2021 11:49:52 UTC. Find more info about the structure of this data set <a href="https://msberends.github.io/AMR/reference/intrinsic_resistant.html">here</a>.</p>
|
||||
<p>It was last updated on 11 December 2021 14:59:42 UTC. Find more info about the structure of this data set <a href="https://msberends.github.io/AMR/reference/intrinsic_resistant.html">here</a>.</p>
|
||||
<p><strong>Direct download links:</strong></p>
|
||||
<ul>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/intrinsic_resistant.rds" class="external-link">R file</a> (78 kB)<br>
|
||||
@ -1057,20 +1057,20 @@ If you are reading this page from within R, please <a href="https://msberends.gi
|
||||
</h2>
|
||||
<p>A data set with 22,000 rows and 10 columns, containing the following column names:<br><em>guideline</em>, <em>method</em>, <em>site</em>, <em>mo</em>, <em>ab</em>, <em>ref_tbl</em>, <em>disk_dose</em>, <em>breakpoint_S</em>, <em>breakpoint_R</em> and <em>uti</em>.</p>
|
||||
<p>This data set is in R available as <code>rsi_translation</code>, after you load the <code>AMR</code> package.</p>
|
||||
<p>It was last updated on 6 October 2021 14:38:29 UTC. Find more info about the structure of this data set <a href="https://msberends.github.io/AMR/reference/rsi_translation.html">here</a>.</p>
|
||||
<p>It was last updated on 12 December 2021 10:27:59 UTC. Find more info about the structure of this data set <a href="https://msberends.github.io/AMR/reference/rsi_translation.html">here</a>.</p>
|
||||
<p><strong>Direct download links:</strong></p>
|
||||
<ul>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.rds" class="external-link">R file</a> (37 kB)<br>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.rds" class="external-link">R file</a> (39 kB)<br>
|
||||
</li>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.xlsx" class="external-link">Excel file</a> (0.7 MB)<br>
|
||||
</li>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.txt" class="external-link">plain text file</a> (1.8 MB)<br>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.txt" class="external-link">plain text file</a> (1.9 MB)<br>
|
||||
</li>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.sas" class="external-link">SAS file</a> (3.8 MB)<br>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.sas" class="external-link">SAS file</a> (4 MB)<br>
|
||||
</li>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.sav" class="external-link">SPSS file</a> (2.4 MB)<br>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.sav" class="external-link">SPSS file</a> (2.6 MB)<br>
|
||||
</li>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.dta" class="external-link">Stata file</a> (3.5 MB)</li>
|
||||
<li>Download as <a href="https://github.com/msberends/AMR/raw/main/data-raw/../data-raw/rsi_translation.dta" class="external-link">Stata file</a> (3.8 MB)</li>
|
||||
</ul>
|
||||
<div class="section level3">
|
||||
<h3 id="source-5">Source<a class="anchor" aria-label="anchor" href="#source-5"></a>
|
||||
|
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Articles • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Articles"><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Articles • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Articles"><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9064</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="How to predict antimicrobial resistance">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -20,7 +20,7 @@
|
||||
<script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet">
|
||||
<script src="../extra.js"></script><meta property="og:title" content="Welcome to the `AMR` package">
|
||||
<meta property="og:description" content="AMR">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -44,7 +44,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9064</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
@ -201,7 +201,8 @@
|
||||
<p>Note: to keep the package size as small as possible, we only included this vignette on CRAN. You can read more vignettes on our website about how to conduct AMR data analysis, determine MDRO’s, find explanation of EUCAST rules, and much more: <a href="https://msberends.github.io/AMR/articles/" class="uri">https://msberends.github.io/AMR/articles/</a>.</p>
|
||||
<hr>
|
||||
<p><code>AMR</code> is a free, open-source and independent R package (see <a href="https://msberends.github.io/AMR/#copyright">Copyright</a>) to simplify the analysis and prediction of Antimicrobial Resistance (AMR) and to work with microbial and antimicrobial data and properties, by using evidence-based methods. <strong>Our aim is to provide a standard</strong> for clean and reproducible antimicrobial resistance data analysis, that can therefore empower epidemiological analyses to continuously enable surveillance and treatment evaluation in any setting.</p>
|
||||
<p>After installing this package, R knows ~71,000 distinct microbial species and all ~560 antibiotic, antimycotic and antiviral drugs by name and code (including ATC, EARS-Net, PubChem, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data. Antimicrobial names and group names are available in Danish, Dutch, English, French, German, Italian, Portuguese and Spanish.</p>
|
||||
<p>After installing this package, R knows ~71,000 distinct microbial species and all ~560 antibiotic, antimycotic and antiviral drugs by name and code (including ATC, EARS-Net, PubChem, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data.</p>
|
||||
<p>The <code>AMR</code> package is available in Danish, Dutch, English, French, German, Italian, Portuguese, Russian, Spanish and Swedish. Antimicrobial drug (group) names and colloquial microorganism names are provided in these languages.</p>
|
||||
<p>This package is fully independent of any other R package and works on Windows, macOS and Linux with all versions of R since R-3.0 (April 2013). <strong>It was designed to work in any setting, including those with very limited resources</strong>. Since its first public release in early 2018, this package has been downloaded from more than 175 countries.</p>
|
||||
<p>This package can be used for:</p>
|
||||
<ul>
|
||||
|
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Authors and Citation • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="bootstrap-toc.css"><script src="bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="pkgdown.css" rel="stylesheet"><script src="pkgdown.js"></script><link href="extra.css" rel="stylesheet"><script src="extra.js"></script><meta property="og:title" content="Authors and Citation"><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Authors and Citation • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="bootstrap-toc.css"><script src="bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="pkgdown.css" rel="stylesheet"><script src="pkgdown.js"></script><link href="extra.css" rel="stylesheet"><script src="extra.js"></script><meta property="og:title" content="Authors and Citation"><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9064</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9069</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
10
docs/browserconfig.xml
Normal file
@ -0,0 +1,10 @@
|
||||
<?xml version="1.0" encoding="utf-8"?>
|
||||
<browserconfig>
|
||||
<msapplication>
|
||||
<tile>
|
||||
<square150x150logo src="/mstile-150x150.png?v=2"/>
|
||||
<square310x310logo src="/mstile-310x310.png?v=2"/>
|
||||
<TileColor>#eeeeee</TileColor>
|
||||
</tile>
|
||||
</msapplication>
|
||||
</browserconfig>
|
@ -268,6 +268,7 @@ table a:not(.btn):hover {
|
||||
/* AMR logo on index page */
|
||||
.template-home h1 img {
|
||||
height: 120px;
|
||||
margin-right: 10px !important;
|
||||
}
|
||||
|
||||
.btn.btn-info.btn-amr {
|
||||
|
@ -116,8 +116,8 @@ $(document).ready(function() {
|
||||
}
|
||||
$(".template-authors").html(doct_tit($(".template-authors").html()));
|
||||
$(".template-citation-authors").html(doct_tit($(".template-citation-authors").html()));
|
||||
$('.template-citation-authors h1').eq(0).html("How to cite the <code>AMR</code> package");
|
||||
$('.template-citation-authors h1').eq(1).html("All contributors of the <code>AMR</code> package");
|
||||
$('.template-citation-authors h1').eq(0).html("All contributors of the <code>AMR</code> package");
|
||||
$('.template-citation-authors h1').eq(1).html("How to cite the <code>AMR</code> package");
|
||||
$(".developers").html(doct_tit($(".developers").html()));
|
||||
$(".developers a[href='authors.html']").text("All contributors...");
|
||||
});
|
||||
|
Before Width: | Height: | Size: 946 B After Width: | Height: | Size: 1.2 KiB |
Before Width: | Height: | Size: 1.6 KiB After Width: | Height: | Size: 2.2 KiB |
BIN
docs/favicon.ico
Before Width: | Height: | Size: 15 KiB After Width: | Height: | Size: 15 KiB |
@ -23,7 +23,7 @@
|
||||
data analysis and to work with microbial and antimicrobial properties by
|
||||
using evidence-based methods and reliable reference data such as LPSN
|
||||
<doi:10.1099/ijsem.0.004332>.">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.png">
|
||||
<meta property="og:image" content="https://msberends.github.io/AMR/logo.svg">
|
||||
<meta name="twitter:card" content="summary_large_image">
|
||||
<meta name="twitter:creator" content="@msberends">
|
||||
<meta name="twitter:site" content="@univgroningen">
|
||||
@ -47,7 +47,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9064</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9069</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
@ -192,16 +192,18 @@
|
||||
<div class="contents col-md-9">
|
||||
<div class="section level1">
|
||||
<div class="page-header"><h1 id="amr-for-r-">
|
||||
<code>AMR</code> (for R) <img src="./logo.png" align="right" height="120px"><a class="anchor" aria-label="anchor" href="#amr-for-r-"></a>
|
||||
<code>AMR</code> (for R) <img src="./logo.svg" align="right"><a class="anchor" aria-label="anchor" href="#amr-for-r-"></a>
|
||||
</h1></div>
|
||||
<blockquote>
|
||||
<p>Update: The latest <a href="https://www.eucast.org/expert_rules_and_intrinsic_resistance/" class="external-link">EUCAST guideline for intrinsic resistance</a> (v3.3, October 2021) is now supported, and our taxonomy tables have been updated as well (LPSN, 5 October 2021). <strong>A new version will be released after the <a href="https://www.eucast.org/clinical_breakpoints/" class="external-link">EUCAST guideline for clinical breakpoints</a> (v12.0, likely January 2022) are implemented, to be expected shortly after the official guideline release.</strong></p>
|
||||
<p>Update: The latest <a href="https://www.eucast.org/expert_rules_and_intrinsic_resistance/" class="external-link">EUCAST guideline for intrinsic resistance</a> (v3.3, October 2021) is now supported, the CLSI 2021 interpretation guideline is now supported, and our taxonomy tables have been updated as well (LPSN, 5 October 2021).</p>
|
||||
<p><strong>A new version will be released after the <a href="https://www.eucast.org/clinical_breakpoints/" class="external-link">EUCAST guideline for clinical breakpoints</a> (v12.0, likely January 2022) are implemented as well, to be expected shortly after the official guideline release.</strong></p>
|
||||
</blockquote>
|
||||
<div class="section level3">
|
||||
<h3 id="what-is-amr-for-r">What is <code>AMR</code> (for R)?<a class="anchor" aria-label="anchor" href="#what-is-amr-for-r"></a>
|
||||
</h3>
|
||||
<p><code>AMR</code> is a free, open-source and independent <a href="https://www.r-project.org" class="external-link">R package</a> (see <a href="#copyright">Copyright</a>) to simplify the analysis and prediction of Antimicrobial Resistance (AMR) and to work with microbial and antimicrobial data and properties, by using evidence-based methods. <strong>Our aim is to provide a standard</strong> for clean and reproducible AMR data analysis, that can therefore empower epidemiological analyses to continuously enable surveillance and treatment evaluation in any setting.</p>
|
||||
<p>After installing this package, R knows <a href="./reference/microorganisms.html"><strong>~71,000 distinct microbial species</strong></a> and all <a href="./reference/antibiotics.html"><strong>~560 antibiotic, antimycotic and antiviral drugs</strong></a> by name and code (including ATC, EARS-Net, PubChem, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data. Antimicrobial names and group names are available in Danish, Dutch, English, French, German, Italian, Portuguese and Spanish.</p>
|
||||
<p>After installing this package, R knows <a href="./reference/microorganisms.html"><strong>~71,000 distinct microbial species</strong></a> and all <a href="./reference/antibiotics.html"><strong>~560 antibiotic, antimycotic and antiviral drugs</strong></a> by name and code (including ATC, EARS-Net, PubChem, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data.</p>
|
||||
<p>The <code>AMR</code> package is available in <img src="lang_da.svg" style="height: 11px !important; vertical-align: initial !important;"> Danish, <img src="lang_nl.svg" style="height: 11px !important; vertical-align: initial !important;"> Dutch, <img src="lang_en.svg" style="height: 11px !important; vertical-align: initial !important;"> English, <img src="lang_fr.svg" style="height: 11px !important; vertical-align: initial !important;"> French, <img src="lang_de.svg" style="height: 11px !important; vertical-align: initial !important;"> German, <img src="lang_it.svg" style="height: 11px !important; vertical-align: initial !important;"> Italian, <img src="lang_pt.svg" style="height: 11px !important; vertical-align: initial !important;"> Portuguese, <img src="lang_ru.svg" style="height: 11px !important; vertical-align: initial !important;"> Russian, <img src="lang_es.svg" style="height: 11px !important; vertical-align: initial !important;"> Spanish and <img src="lang_sv.svg" style="height: 11px !important; vertical-align: initial !important;"> Swedish. Antimicrobial drug (group) names and colloquial microorganism names are provided in these languages.</p>
|
||||
<p>This package is <a href="https://en.wikipedia.org/wiki/Dependency_hell" class="external-link">fully independent of any other R package</a> and works on Windows, macOS and Linux with all versions of R since R-3.0 (April 2013). <strong>It was designed to work in any setting, including those with very limited resources</strong>. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the <a href="https://www.rug.nl" class="external-link">University of Groningen</a>, in collaboration with non-profit organisations <a href="https://www.certe.nl" class="external-link">Certe Medical Diagnostics and Advice Foundation</a> and <a href="https://www.umcg.nl" class="external-link">University Medical Center Groningen</a>. This R package formed the basis of two PhD theses (<a href="https://doi.org/10.33612/diss.177417131" class="external-link">DOI 10.33612/diss.177417131</a> and <a href="https://doi.org/10.33612/diss.192486375" class="external-link">DOI 10.33612/diss.192486375</a>) but is <a href="./news">actively and durably maintained</a> by two public healthcare organisations in the Netherlands.</p>
|
||||
<div class="main-content" style="display: inline-block;">
|
||||
<p>
|
||||
|
1
docs/lang_da.svg
Normal file
@ -0,0 +1 @@
|
||||
<?xml version="1.0" encoding="UTF-8"?><svg xmlns="http://www.w3.org/2000/svg" viewBox="0 0 37 28"><path fill="#c60c30" d="M0,0H37V28H0Z"/><path fill="#fff" d="M0,12H12V0H16V12H37V16H16V28H12V16H0Z"/></svg>
|
After Width: | Height: | Size: 205 B |
9
docs/lang_de.svg
Normal file
@ -0,0 +1,9 @@
|
||||
<?xml version="1.0" encoding="UTF-8" standalone="no"?>
|
||||
<!DOCTYPE svg PUBLIC "-//W3C//DTD SVG 1.1//EN"
|
||||
"http://www.w3.org/Graphics/SVG/1.1/DTD/svg11.dtd">
|
||||
<svg xmlns="http://www.w3.org/2000/svg" width="1000" height="600" viewBox="0 0 5 3">
|
||||
<desc>Flag of Germany</desc>
|
||||
<rect id="black_stripe" width="5" height="3" y="0" x="0" fill="#000"/>
|
||||
<rect id="red_stripe" width="5" height="2" y="1" x="0" fill="#D00"/>
|
||||
<rect id="gold_stripe" width="5" height="1" y="2" x="0" fill="#FFCE00"/>
|
||||
</svg>
|
After Width: | Height: | Size: 502 B |
16
docs/lang_en.svg
Normal file
@ -0,0 +1,16 @@
|
||||
<?xml version="1.0"?>
|
||||
<svg xmlns="http://www.w3.org/2000/svg" viewBox="0 0 60 30" width="1200" height="600">
|
||||
<clipPath id="s">
|
||||
<path d="M0,0 v30 h60 v-30 z"/>
|
||||
</clipPath>
|
||||
<clipPath id="t">
|
||||
<path d="M30,15 h30 v15 z v15 h-30 z h-30 v-15 z v-15 h30 z"/>
|
||||
</clipPath>
|
||||
<g clip-path="url(#s)">
|
||||
<path d="M0,0 v30 h60 v-30 z" fill="#012169"/>
|
||||
<path d="M0,0 L60,30 M60,0 L0,30" stroke="#fff" stroke-width="6"/>
|
||||
<path d="M0,0 L60,30 M60,0 L0,30" clip-path="url(#t)" stroke="#C8102E" stroke-width="4"/>
|
||||
<path d="M30,0 v30 M0,15 h60" stroke="#fff" stroke-width="10"/>
|
||||
<path d="M30,0 v30 M0,15 h60" stroke="#C8102E" stroke-width="6"/>
|
||||
</g>
|
||||
</svg>
|
After Width: | Height: | Size: 641 B |
406
docs/lang_es.svg
Normal file
After Width: | Height: | Size: 59 KiB |
2
docs/lang_fr.svg
Normal file
@ -0,0 +1,2 @@
|
||||
<?xml version="1.0" encoding="UTF-8"?>
|
||||
<svg xmlns="http://www.w3.org/2000/svg" width="900" height="600"><rect width="900" height="600" fill="#ED2939"/><rect width="600" height="600" fill="#fff"/><rect width="300" height="600" fill="#002395"/></svg>
|
After Width: | Height: | Size: 249 B |
6
docs/lang_it.svg
Normal file
@ -0,0 +1,6 @@
|
||||
<?xml version="1.0" encoding="UTF-8"?>
|
||||
<svg xmlns="http://www.w3.org/2000/svg" width="1500" height="1000" viewBox="0 0 3 2">
|
||||
<rect width="3" height="2" fill="#009246"/>
|
||||
<rect width="2" height="2" x="1" fill="#fff"/>
|
||||
<rect width="1" height="2" x="2" fill="#ce2b37"/>
|
||||
</svg>
|
After Width: | Height: | Size: 273 B |
5
docs/lang_nl.svg
Normal file
@ -0,0 +1,5 @@
|
||||
<svg xmlns="http://www.w3.org/2000/svg" width="900" height="600" viewBox="0 0 9 6">
|
||||
<rect fill="#21468B" width="9" height="6"/>
|
||||
<rect fill="#FFF" width="9" height="4"/>
|
||||
<rect fill="#AE1C28" width="9" height="2"/>
|
||||
</svg>
|
After Width: | Height: | Size: 223 B |
67
docs/lang_pt.svg
Normal file
@ -0,0 +1,67 @@
|
||||
<?xml version="1.0" encoding="UTF-8"?>
|
||||
<svg xmlns="http://www.w3.org/2000/svg" xmlns:xlink="http://www.w3.org/1999/xlink" width="600" height="400">
|
||||
<rect width="600" height="400" fill="#f00"/>
|
||||
<rect width="240" height="400" fill="#060"/>
|
||||
<g fill="#ff0" fill-rule="evenodd" stroke="#000" stroke-width="0.573" stroke-linecap="round" stroke-linejoin="round">
|
||||
<path d="m318.24,262.04c-30.21-0.91-168.74-87.38-169.69-101.15l7.6496-12.757c13.741,19.966,155.36,104.06,169.27,101.08l-7.2299,12.823"/>
|
||||
<path d="m154.59,146.4c-2.7101,7.2937,36.149,31.318,82.903,59.754,46.752,28.434,87.065,46.006,90.053,43.486,0.18256-0.32544,1.4701-2.5409,1.352-2.5232-0.56001,0.84402-1.9234,1.1104-4.0506,0.49741-12.631-3.6433-45.575-18.765-86.374-43.506-40.798-24.743-76.294-47.544-81.811-57.232-0.38363-0.67116-0.65702-1.8962-0.60146-2.8487l-0.13405-0.002-1.1747,2.0532-0.16139,0.32191h-0.00088zm164.36,116.04c-0.51238,0.92957-1.4675,0.96044-3.2816,0.76112-11.3-1.2506-45.589-17.925-86.162-42.213-47.21-28.26-86.2-54.01-81.97-60.74l1.1509-2.0346,0.22665,0.0706c-3.8037,11.405,76.948,57.578,81.702,60.522,46.724,28.947,86.115,45.851,89.601,41.458l-1.2682,2.181v-0.002z"/>
|
||||
<path d="m240.17,169.23c30.237-0.23901,67.55-4.1319,89.023-12.69l-4.6265-7.5168c-12.692,7.0247-50.21,11.644-84.652,12.335-40.736-0.37483-69.49-4.1681-83.897-13.835l-4.3672,8.0045c26.484,11.207,53.623,13.587,88.52,13.703"/>
|
||||
<path d="m330.44,156.71c-0.73904,1.1818-14.743,6.0113-35.373,9.5753-13.988,2.1325-32.234,3.9555-55.004,3.9776-21.633,0.0203-39.305-1.5196-52.684-3.3329-21.656-3.3955-32.833-8.1201-36.965-9.7896,0.39509-0.78581,0.64908-1.337,1.0301-2.0708,11.895,4.736,23.124,7.5918,36.279,9.6158,13.291,1.8,30.75,3.362,52.276,3.3417,22.664-0.0229,40.709-1.9844,54.616-4.0534,21.155-3.4122,32.711-7.8034,34.334-9.8425l1.494,2.5788h-0.002zm-4.0603-7.6226c-2.293,1.8415-13.718,5.8932-33.819,9.1034-13.415,1.9226-30.472,3.6433-52.265,3.6645-20.704,0.0203-37.619-1.375-50.485-3.2491-20.414-2.6661-31.279-7.4754-35.196-8.8776,0.3898-0.67381,0.78666-1.3423,1.1941-2.0135,3.0479,1.5346,13.533,5.7909,34.226,8.7224,12.72,1.8036,29.661,3.1477,50.262,3.1265,21.69-0.0221,38.553-1.7762,51.883-3.6883,20.205-2.7799,31.077-7.9472,32.728-9.241l1.4728,2.4509v0.002z"/>
|
||||
<path d="m140.88,205.66c18.598,10.003,59.905,15.044,98.994,15.391,35.591,0.0564,81.958-5.5016,99.297-14.69l-0.47712-10.012c-5.4246,8.4773-55.113,16.609-99.206,16.276-44.093-0.3325-85.038-7.1429-98.687-15.959l0.0794,8.9914"/>
|
||||
<path d="m340.12,204.22,0.00088,2.3874c-2.606,3.1159-18.946,7.8255-39.437,11.142-15.595,2.391-35.927,4.1945-61.262,4.1945-24.069,0-43.263-1.7163-58.148-4.0014-23.529-3.4264-38.579-9.4262-41.6-11.217l0.0132-2.7852c9.0748,6.0334,33.661,10.447,41.917,11.798,14.788,2.2701,33.868,3.9732,57.817,3.9732,25.216,0,45.434-1.7912,60.931-4.1663,14.701-2.1237,35.644-7.6465,39.767-11.324h0.00088zm0.01-8.4922,0.00088,2.3874c-2.606,3.1142-18.946,7.8237-39.437,11.14-15.595,2.391-35.927,4.1945-61.262,4.1945-24.069,0-43.263-1.7145-58.148-4.0014-23.529-3.4246-38.579-9.4245-41.6-11.216l0.0132-2.7852c9.0748,6.0325,33.661,10.447,41.917,11.796,14.788,2.2719,33.868,3.9758,57.817,3.9758,25.216,0,45.434-1.7921,60.931-4.169,14.701-2.1237,35.644-7.6465,39.767-11.324l0.00088,0.002z"/>
|
||||
<path d="m239.79,260.32c-42.772-0.25489-79.421-11.659-87.16-13.544l5.6433,8.8344c13.67,5.7503,49.424,14.32,81.927,13.371,32.504-0.94809,60.91-3.466,80.928-13.211l5.7862-9.1555c-13.642,6.425-60.068,13.639-87.125,13.705"/>
|
||||
<path stroke-width="0.55" d="m323.3,253.72c-0.85016,1.2991-1.7171,2.5823-2.5963,3.8294-9.4417,3.3293-24.319,6.8245-30.597,7.844-12.824,2.6423-32.665,4.594-50.274,4.6029-37.89-0.55474-68.905-7.9719-83.496-14.299l-1.1773-2.0241,0.19225-0.30427,1.9966,0.77435c25.948,9.2834,55.091,12.987,82.698,13.652,17.538,0.0617,35.095-2.01,49.292-4.5491,21.771-4.3621,30.574-7.65,33.275-9.1405l0.68701-0.38541h-0.00088zm5.0172-8.2753c0.022,0.0256,0.0441,0.0503,0.0653,0.0776-0.63585,1.0733-1.2911,2.1652-1.9622,3.2623-5.0357,1.8-18.702,5.7988-38.659,8.5893-13.149,1.7912-21.322,3.526-47.479,4.034-49.015-1.2471-80.75-10.831-88.289-13.195l-1.1174-2.1431c28.406,7.4154,57.422,12.592,89.408,13.121,23.931-0.50976,34.112-2.2719,47.152-4.0499,23.271-3.6186,34.996-7.4498,38.515-8.5558-0.0441-0.0635-0.0961-0.13053-0.15433-0.19932l2.5231-0.9428-0.002,0.002z"/>
|
||||
<path d="m328.83,197.76c0.13873,28.137-14.26,53.386-25.858,64.525-16.408,15.759-38.163,25.896-63.569,26.363-28.37,0.52117-55.12-17.974-62.295-26.099-14.028-15.885-25.449-36.057-25.815-63.243,1.7376-30.709,13.793-52.1,31.268-66.769s40.743-21.813,60.121-21.302c22.358,0.59003,48.475,11.558,66.521,33.332,11.823,14.266,16.943,29.748,19.627,53.193zm-89.186-96.342c54.485,0,99.296,44.338,99.296,98.703,0,54.364-44.811,98.704-99.296,98.704s-98.924-44.339-98.924-98.704,44.439-98.703,98.924-98.703"/>
|
||||
<path d="m239.91,101.08c54.534,0,99.011,44.483,99.011,99.022,0,54.538-44.478,99.02-99.011,99.02-54.534,0-99.011-44.481-99.011-99.02s44.478-99.022,99.011-99.022zm-96.832,99.0224c0,53.26,43.736,96.842,96.832,96.842,53.097,0,96.833-43.582,96.833-96.842,0-53.262-43.737-96.844-96.833-96.844s-96.832,43.584-96.832,96.844z"/>
|
||||
<path d="m239.99,109.31c49.731,0,90.693,40.821,90.693,90.704,0,49.884-40.963,90.703-90.693,90.703s-90.693-40.819-90.693-90.703c0-49.883,40.964-90.704,90.693-90.704zm-88.515,90.7034c0,48.685,39.979,88.524,88.515,88.524s88.515-39.839,88.515-88.524c0-48.686-39.978-88.525-88.515-88.525-48.536,0-88.515,39.839-88.515,88.525z"/>
|
||||
<path d="m243.98,100.68-8.48545,0,0.01,198.96,8.51455,0z"/>
|
||||
<path d="m243.13,99.546h2.1598l0.0185,201.25h-2.1616l-0.0159-201.25zm-8.4213,0.0018h2.1766l0.003,201.25h-2.1783v-201.25z"/>
|
||||
<path d="m338.99,203.935,0-7.3554-5.99-5.58-34-9-49-5-59,3-42,10-8.48,6.28,0,7.3572l21.48-9.637,51-8h49l36,4,25,6z"/>
|
||||
<path d="m239.95,184.77c23.383-0.0432,46.07,2.2154,64.065,5.7194,18.569,3.7121,31.637,8.3556,36.105,13.571l-0.005,2.5823c-5.3884-6.4902-22.973-11.248-36.518-13.968-17.858-3.474-40.393-5.7168-63.647-5.6736-24.538,0.0459-47.387,2.3698-64.984,5.8032-14.12,2.8019-32.951,8.3679-35.302,13.858v-2.689c1.2911-3.8003,15.313-9.4792,34.984-13.417,17.729-3.4572,40.62-5.7415,65.302-5.7864zm0.01-8.4922c23.383-0.0423,46.07,2.2172,64.065,5.7194,18.569,3.7139,31.637,8.3556,36.105,13.571l-0.005,2.5823c-5.3884-6.4885-22.973-11.247-36.518-13.966-17.858-3.4757-40.393-5.7185-63.647-5.6736-24.538,0.0441-47.276,2.3698-64.875,5.8014-13.626,2.5832-33.226,8.3696-35.412,13.86v-2.6908c1.2911-3.7588,15.597-9.6414,34.985-13.417,17.729-3.4572,40.62-5.7397,65.302-5.7864z"/>
|
||||
<path d="m239.48,132.96c36.849-0.18433,68.99,5.1523,83.695,12.685l5.3638,9.279c-12.781-6.888-47.456-14.05-89.005-12.979-33.854,0.20814-70.027,3.7271-88.176,13.41l6.4035-10.709c14.895-7.7241,50.022-11.643,81.72-11.684"/>
|
||||
<path d="m239.97,140.62c21.017-0.0556,41.325,1.1298,57.476,4.0437,15.041,2.7993,29.385,7.0009,31.436,9.2604l1.5901,2.8099c-4.9881-3.257-17.401-6.8836-33.339-9.906-16.006-3.0083-36.3-4.0049-57.2-3.9502-23.722-0.0811-42.152,1.1712-57.969,3.9291-16.728,3.13-28.334,7.6015-31.197,9.7261l1.5583-2.9704c5.5631-2.8381,14.39-6.2592,29.223-8.9297,16.357-2.988,34.983-3.8841,58.423-4.0128h-0.00088zm-0.009-8.4843c20.113-0.0529,39.972,1.068,55.452,3.8506,12.209,2.3768,24.283,6.0872,28.704,9.3892l2.3256,3.6954c-3.9536-4.3947-18.836-8.5593-31.974-10.892-15.361-2.6494-34.395-3.698-54.508-3.8656-21.108,0.0591-40.615,1.352-55.752,4.1081-14.441,2.7481-23.76,6.0016-27.703,8.5425l2.0451-3.0868c5.4414-2.8646,14.232-5.4954,25.303-7.6465,15.249-2.7764,34.876-4.0358,56.108-4.0949z"/>
|
||||
<path d="m289.15,241.26c-18.218-3.4008-36.469-3.8947-49.217-3.7447-61.407,0.71967-81.244,12.609-83.665,16.209l-4.5894-7.4815c15.634-11.332,49.073-17.687,88.587-17.037,20.518,0.33602,38.224,1.6986,53.119,4.5835l-4.2358,7.4727"/>
|
||||
<path stroke-width="0.55" d="m239.58,236.46c17.082,0.25488,33.849,0.96044,50.033,3.9784l-1.172,2.069c-15.031-2.7746-31.055-3.8365-48.803-3.75-22.663-0.17727-45.585,1.9394-65.541,7.6668-6.2968,1.7524-16.721,5.8006-17.784,9.1458l-1.1659-1.9226c0.33601-1.9773,6.6363-6.081,18.414-9.3901,22.858-6.5458,44.239-7.6491,66.019-7.799v0.002zm0.77519-8.5963c17.698,0.33073,35.975,1.1492,53.74,4.6681l-1.2206,2.1537c-16.042-3.1847-31.369-4.2466-52.415-4.5702-22.735,0.0414-46.851,1.6625-68.778,8.0372-7.0791,2.062-19.297,6.5202-19.704,10.05l-1.1659-2.0655c0.26545-3.2059,10.842-7.388,20.358-10.156,22.096-6.4241,46.275-8.076,69.186-8.1174z"/>
|
||||
<path d="M327.58,247.38,320.201,258.829,299,240,244,203,182,169,149.81,157.99,156.67,145.27,159,144l20,5,66,34,38,24,32,23,13,15z"/>
|
||||
<path d="m148.65,158.29c5.646-3.8294,47.139,14.655,90.555,40.834,43.301,26.254,84.677,55.921,80.942,61.473l-1.2285,1.9323-0.56354,0.4445c0.12083-0.0864,0.74345-0.84755-0.0609-2.906-1.8449-6.0704-31.195-29.491-79.894-58.895-47.475-28.309-87.041-45.371-90.997-40.494l1.247-2.3892h-0.00089zm180.44,88.927c3.57-7.052-34.916-36.044-82.632-64.272-48.813-27.666-83.994-43.951-90.42-39.095l-1.4278,2.5991c-0.0124,0.14287,0.052-0.17727,0.35364-0.4101,1.1685-1.0195,3.1052-0.95074,3.9792-0.96662,11.065,0.16581,42.667,14.709,87.006,40.128,19.428,11.315,82.071,51.491,81.832,62.789,0.0168,0.97102,0.0803,1.1712-0.28485,1.6519l1.5936-2.4236v-0.002z"/>
|
||||
</g>
|
||||
<g>
|
||||
<path fill="#fff" stroke="#000" stroke-width="0.67037" d="m180.6,211.01c0,16.271,6.6628,30.987,17.457,41.742,10.815,10.778,25.512,17.579,41.809,17.579,16.381,0,31.247-6.6525,42.016-17.389,10.769-10.735,17.443-25.552,17.446-41.88h-0.002v-79.189l-118.74-0.14111,0.0123,79.278h0.002z"/>
|
||||
<path fill="#f00" stroke="#000" stroke-width="0.50734" d="m182.82,211.12v0.045c0,15.557,6.4414,29.724,16.775,40.009,10.354,10.305,24.614,16.712,40.214,16.712,15.681,0,29.912-6.3606,40.222-16.626,10.308-10.265,16.697-24.433,16.699-40.044h-0.002v-76.826l-113.84-0.0185-0.0697,76.748m91.022-53.747,0.004,48.891-0.0414,5.1717h0.00088c0,1.3608-0.082,2.9122-0.24076,4.2333-0.92512,7.7294-4.4801,14.467-9.7451,19.708-6.1636,6.1357-14.671,9.9413-24.047,9.9413-9.327,0-17.639-3.9379-23.829-10.1-6.3497-6.32-10.03-14.986-10.03-23.947l-0.0132-54.023,67.94,0.12259,0.002,0.002z"/>
|
||||
<g id="castle3">
|
||||
<g id="castle" fill="#ff0" stroke="#000" stroke-width="0.5">
|
||||
<path stroke="none" d="m190.19,154.43c0.13493-5.521,4.0524-6.828,4.0806-6.8474,0.0282-0.0185,4.2314,1.4076,4.2173,6.8986l-8.2978-0.0512"/>
|
||||
<path d="m186.81,147.69-0.68172,6.3447,4.1406,0.009c0.0397-5.2493,3.9739-6.1225,4.0691-6.1031,0.0891-0.005,3.9889,1.1606,4.0929,6.1031h4.1511l-0.74962-6.3932-15.022,0.0379v0.002z"/>
|
||||
<path d="m185.85,154.06h16.946c0.35717,0,0.64908,0.35277,0.64908,0.78404,0,0.43039-0.29191,0.78141-0.64908,0.78141h-16.946c-0.35717,0-0.64908-0.35102-0.64908-0.78141,0-0.43127,0.29191-0.78404,0.64908-0.78404z"/>
|
||||
<path d="m192.01,154.03c0.0185-3.3126,2.2621-4.2501,2.2736-4.2483,0.00088,0,2.3423,0.96661,2.3609,4.2483h-4.6344"/>
|
||||
<path d="m186.21,145.05h16.245c0.34218,0,0.62263,0.31839,0.62263,0.70468,0,0.38717-0.28045,0.70467-0.62263,0.70467h-16.245c-0.34218,0-0.62263-0.31573-0.62263-0.70467,0-0.38629,0.28045-0.70468,0.62263-0.70468z"/>
|
||||
<path d="m186.55,146.47h15.538c0.32719,0,0.59529,0.31662,0.59529,0.70379,0,0.38805-0.2681,0.70467-0.59529,0.70467h-15.538c-0.32719,0-0.59529-0.31662-0.59529-0.70467,0-0.38717,0.2681-0.70379,0.59529-0.70379z"/>
|
||||
<path d="m191.57,135.88,1.2267,0.002v0.87136h0.89513v-0.89076l1.2567,0.004v0.88723h0.89778v-0.89076h1.2576l-0.002,2.0117c0,0.31574-0.25398,0.52035-0.54854,0.52035h-4.4113c-0.29633,0-0.56972-0.23724-0.5706-0.52652l-0.003-1.9879h0.00088z"/>
|
||||
<path d="m196.19,138.57,0.27691,6.4514-4.3028-0.0159,0.28486-6.4523,3.741,0.0168"/>
|
||||
<path id="cp1" d="m190.94,141.56,0.13141,3.4775-4.1256,0.002,0.11641-3.4793h3.8786-0.00089z"/>
|
||||
<use xlink:href="#cp1" x="10.609"/>
|
||||
<path id="cp2" d="m186.3,139.04,1.1994,0.003v0.87224h0.8775v-0.89253l1.2294,0.004v0.889h0.87926v-0.89253l1.2302,0.002-0.002,2.0117c0,0.31398-0.2487,0.51859-0.5362,0.51859h-4.3169c-0.28926,0-0.55824-0.23548-0.55913-0.52564l-0.003-1.9888h0.00088z"/>
|
||||
<use xlink:href="#cp2" x="10.609"/>
|
||||
<path fill="#000" stroke="none" d="m193.9,140.61c-0.0265-0.62706,0.87661-0.63411,0.86603,0v1.5364h-0.866v-1.536"/>
|
||||
<path id="cp3" fill="#000" stroke="none" d="m188.57,142.84c-0.003-0.6059,0.83693-0.61824,0.82635,0v1.1871h-0.826v-1.187"/>
|
||||
<use xlink:href="#cp3" x="10.641"/>
|
||||
</g>
|
||||
<use xlink:href="#castle" y="46.3198"/>
|
||||
<use xlink:href="#castle" transform="matrix(0.70460892,-0.70959585,0.70959585,0.70460892,-35.341459,275.10898)"/>
|
||||
</g>
|
||||
<use xlink:href="#castle" x="45.7138"/>
|
||||
<use xlink:href="#castle3" transform="matrix(-1,0,0,1,479.79195,0)"/>
|
||||
<g id="quina" fill="#fff">
|
||||
<path fill="#039" d="m232.636,202.406v0.005c0,2.2119,0.84927,4.2272,2.2118,5.6894,1.3652,1.4667,3.2454,2.3777,5.302,2.3777,2.0672,0,3.9439-0.90487,5.3029-2.3654,1.3581-1.4587,2.2021-3.47219,2.2021-5.693v-10.768l-14.992-0.0123-0.0273,10.766"/>
|
||||
<circle cx="236.074" cy="195.735" r="1.486"/>
|
||||
<circle cx="244.392" cy="195.742" r="1.486"/>
|
||||
<circle cx="240.225" cy="199.735" r="1.486"/>
|
||||
<circle cx="236.074" cy="203.916" r="1.486"/>
|
||||
<circle cx="244.383" cy="203.905" r="1.486"/>
|
||||
</g>
|
||||
<use xlink:href="#quina" y="-26.016"/>
|
||||
<use xlink:href="#quina" x="-20.799"/>
|
||||
<use xlink:href="#quina" x="20.745"/>
|
||||
<use xlink:href="#quina" y="25.784"/>
|
||||
</g>
|
||||
</svg>
|
After Width: | Height: | Size: 13 KiB |
1
docs/lang_ru.svg
Normal file
@ -0,0 +1 @@
|
||||
<?xml version="1.0" encoding="UTF-8"?><svg xmlns="http://www.w3.org/2000/svg" viewBox="0 0 9 6" width="900" height="600"><rect fill="#fff" width="9" height="3"/><rect fill="#d52b1e" y="3" width="9" height="3"/><rect fill="#0039a6" y="2" width="9" height="2"/></svg>
|
After Width: | Height: | Size: 265 B |
1
docs/lang_sv.svg
Normal file
@ -0,0 +1 @@
|
||||
<?xml version="1.0" encoding="UTF-8"?><svg xmlns="http://www.w3.org/2000/svg" viewBox="0 0 16 10"><path fill="#006aa7" d="M0,0H16V10H0Z"/><path fill="#fecc00" d="M0,4H5V0H7V4H16V6H7V10H5V6H0Z"/></svg>
|
After Width: | Height: | Size: 200 B |
BIN
docs/logo.png
Before Width: | Height: | Size: 56 KiB |
3335
docs/logo.svg
Normal file
After Width: | Height: | Size: 164 KiB |
BIN
docs/mstile-150x150.png
Normal file
After Width: | Height: | Size: 9.3 KiB |
BIN
docs/mstile-310x310.png
Normal file
After Width: | Height: | Size: 23 KiB |
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Changelog • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Changelog"><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Changelog • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Changelog"><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9066</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9069</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
@ -157,21 +157,24 @@
|
||||
</div>
|
||||
|
||||
<div class="section level2">
|
||||
<h2 class="page-header" data-toc-text="1.7.1.9066" id="amr-1719066">
|
||||
<code>AMR</code> 1.7.1.9066<a class="anchor" aria-label="anchor" href="#amr-1719066"></a></h2>
|
||||
<h2 class="page-header" data-toc-text="1.7.1.9069" id="amr-1719069">
|
||||
<code>AMR</code> 1.7.1.9069<a class="anchor" aria-label="anchor" href="#amr-1719069"></a></h2>
|
||||
<div class="section level3">
|
||||
<h3 id="last-updated-december-1-7-1-9066"><small>Last updated: 11 December 2021</small><a class="anchor" aria-label="anchor" href="#last-updated-december-1-7-1-9066"></a></h3>
|
||||
<h3 id="last-updated-december-1-7-1-9069"><small>Last updated: 12 December 2021</small><a class="anchor" aria-label="anchor" href="#last-updated-december-1-7-1-9069"></a></h3>
|
||||
<p>All functions in this package are now all considered to be stable. Updates to the AMR interpretation rules (such as by EUCAST and CLSI), the microbial taxonomy, and the antibiotic dosages will all be updated every 6 to 12 months from now on.</p>
|
||||
<div class="section level4">
|
||||
<h4 id="breaking-changes-1-7-1-9066">Breaking changes<a class="anchor" aria-label="anchor" href="#breaking-changes-1-7-1-9066"></a></h4>
|
||||
<h4 id="breaking-changes-1-7-1-9069">Breaking changes<a class="anchor" aria-label="anchor" href="#breaking-changes-1-7-1-9069"></a></h4>
|
||||
<ul><li>Removed <code>p_symbol()</code> and all <code>filter_*()</code> functions (except for <code><a href="../reference/first_isolate.html">filter_first_isolate()</a></code>), which were all deprecated in a previous package version</li>
|
||||
<li>Removed the <code>key_antibiotics()</code> and <code>key_antibiotics_equal()</code> functions, which were deprecated and superseded by <code><a href="../reference/key_antimicrobials.html">key_antimicrobials()</a></code> and <code><a href="../reference/key_antimicrobials.html">antimicrobials_equal()</a></code>
|
||||
</li>
|
||||
<li>Removed all previously implemented <code><a href="https://ggplot2.tidyverse.org/reference/ggplot.html" class="external-link">ggplot2::ggplot()</a></code> generics for classes <code><mic></code>, <code><disk></code>, <code><rsi></code> and <code><resistance_predict></code> as they did not follow the <code>ggplot2</code> logic. They were replaced with <code><a href="https://ggplot2.tidyverse.org/reference/autoplot.html" class="external-link">ggplot2::autoplot()</a></code> generics.</li>
|
||||
<li>Renamed function <code>get_locale()</code> to <code><a href="../reference/translate.html">get_AMR_locale()</a></code> to prevent conflicts with other packages</li>
|
||||
</ul></div>
|
||||
<div class="section level4">
|
||||
<h4 id="new-1-7-1-9066">New<a class="anchor" aria-label="anchor" href="#new-1-7-1-9066"></a></h4>
|
||||
<ul><li><p>Support for EUCAST Intrinsic Resistance and Unusual Phenotypes v3.3 (October 2021). This is now the default EUCAST guideline in the package (all older guidelines are still available) for <code><a href="../reference/eucast_rules.html">eucast_rules()</a></code>, <code>mo_intrinsic_resistant()</code> and <code><a href="../reference/mdro.html">mdro()</a></code>. The <code>intrinsic_resistant</code> data set was also updated accordingly.</p></li>
|
||||
<li><p>Support for Danish, and also added missing translations of all antimicrobial drugs in Italian, French and Portuguese</p></li>
|
||||
<h4 id="new-1-7-1-9069">New<a class="anchor" aria-label="anchor" href="#new-1-7-1-9069"></a></h4>
|
||||
<ul><li><p>Support for the CLSI 2021 guideline for interpreting MIC/disk diffusion values, which are incorporated in the <code>rsi_translation</code> data set</p></li>
|
||||
<li><p>Support for EUCAST Intrinsic Resistance and Unusual Phenotypes v3.3 (October 2021). This is now the default EUCAST guideline in the package (all older guidelines are still available) for <code><a href="../reference/eucast_rules.html">eucast_rules()</a></code>, <code>mo_intrinsic_resistant()</code> and <code><a href="../reference/mdro.html">mdro()</a></code>. The <code>intrinsic_resistant</code> data set was also updated accordingly.</p></li>
|
||||
<li><p>Support for all antimicrobial drug (group) names and colloquial microorganism names in Danish, Dutch, English, French, German, Italian, Portuguese, Russian, Spanish and Swedish</p></li>
|
||||
<li>
|
||||
<p>Function <code><a href="../reference/ab_property.html">set_ab_names()</a></code> to rename data set columns that resemble antimicrobial drugs. This allows for quickly renaming columns to official names, ATC codes, etc. Its second argument can be a tidyverse way of selecting:</p>
|
||||
<div class="sourceCode" id="cb1"><pre class="downlit sourceCode r">
|
||||
@ -183,7 +186,7 @@
|
||||
<li><p>Function <code><a href="../reference/ab_property.html">ab_ddd_units()</a></code> to get units of DDDs (daily defined doses), deprecating the use of <code>ab_ddd(..., units = TRUE)</code> to be more consistent in data types of function output</p></li>
|
||||
</ul></div>
|
||||
<div class="section level4">
|
||||
<h4 id="changed-1-7-1-9066">Changed<a class="anchor" aria-label="anchor" href="#changed-1-7-1-9066"></a></h4>
|
||||
<h4 id="changed-1-7-1-9069">Changed<a class="anchor" aria-label="anchor" href="#changed-1-7-1-9069"></a></h4>
|
||||
<ul><li>Updated the bacterial taxonomy to 5 October 2021 (according to <a href="https://lpsn.dsmz.de" class="external-link">LPSN</a>), including all 11 new staphylococcal species named since 1 January last year</li>
|
||||
<li>The <code>antibiotics</code> data set now contains <strong>all ATC codes</strong> that are available through the <a href="https://www.whocc.no" class="external-link">WHOCC website</a>, regardless of drugs being present in more than one ATC group. This means that:
|
||||
<ul><li>Some drugs now contain multiple ATC codes (e.g., metronidazole contains 5)</li>
|
||||
@ -229,7 +232,7 @@
|
||||
</li>
|
||||
<li>The right input types for <code><a href="../reference/random.html">random_mic()</a></code>, <code><a href="../reference/random.html">random_disk()</a></code> and <code><a href="../reference/random.html">random_rsi()</a></code> are now enforced</li>
|
||||
<li>
|
||||
<code><a href="../reference/as.rsi.html">as.rsi()</a></code> has an improved algorithm and can now also correct for textual input (such as “Susceptible”, “Resistant”) in Danish, Dutch, English, French, German, Italian, Portuguese and Spanish</li>
|
||||
<code><a href="../reference/as.rsi.html">as.rsi()</a></code> has an improved algorithm and can now also correct for textual input (such as “Susceptible”, “Resistant”) in all supported languages</li>
|
||||
<li>
|
||||
<code><a href="../reference/as.mic.html">as.mic()</a></code> has an improved algorithm</li>
|
||||
<li>When warnings are thrown because of too few isolates in any <code>count_*()</code>, <code>proportion_*()</code> function (or <code>resistant()</code> or <code>susceptible()</code>), the <code>dplyr</code> group will be shown, if available</li>
|
||||
@ -252,8 +255,8 @@
|
||||
<code><a href="../reference/get_episode.html">get_episode()</a></code> and <code><a href="../reference/get_episode.html">is_new_episode()</a></code> can now cope with <code>NA</code>s</li>
|
||||
</ul></div>
|
||||
<div class="section level4">
|
||||
<h4 id="other-1-7-1-9066">Other<a class="anchor" aria-label="anchor" href="#other-1-7-1-9066"></a></h4>
|
||||
<ul><li>This package is now being maintained by two epidemiologists and a data scientist from two different non-profit healthcare organisations. All functions in this package are now all considered to be stable. Updates to the AMR interpretation rules (such as by EUCAST and CLSI), the microbial taxonomy, and the antibiotic dosages will all be updated every 6 to 12 months from now on.</li>
|
||||
<h4 id="other-1-7-1-9069">Other<a class="anchor" aria-label="anchor" href="#other-1-7-1-9069"></a></h4>
|
||||
<ul><li>This package is now being maintained by two epidemiologists and a data scientist from two different non-profit healthcare organisations.</li>
|
||||
</ul></div>
|
||||
</div>
|
||||
</div>
|
||||
@ -623,7 +626,7 @@
|
||||
<li>Big speed improvement for already valid microorganism ID. This also means an significant speed improvement for using <code>mo_*</code> functions like <code><a href="../reference/mo_property.html">mo_name()</a></code> on microoganism IDs.</li>
|
||||
<li>Added argument <code>ignore_pattern</code> to <code><a href="../reference/as.mo.html">as.mo()</a></code> which can also be given to <code>mo_*</code> functions like <code><a href="../reference/mo_property.html">mo_name()</a></code>, to exclude known non-relevant input from analysing. This can also be set with the option <code>AMR_ignore_pattern</code>.</li>
|
||||
</ul></li>
|
||||
<li><p><code><a href="../reference/translate.html">get_locale()</a></code> now uses at default <code>Sys.getenv("LANG")</code> or, if <code>LANG</code> is not set, <code><a href="https://rdrr.io/r/base/locales.html" class="external-link">Sys.getlocale()</a></code>. This can be overwritten by setting the option <code>AMR_locale</code>.</p></li>
|
||||
<li><p><code>get_locale()</code> now uses at default <code>Sys.getenv("LANG")</code> or, if <code>LANG</code> is not set, <code><a href="https://rdrr.io/r/base/locales.html" class="external-link">Sys.getlocale()</a></code>. This can be overwritten by setting the option <code>AMR_locale</code>.</p></li>
|
||||
<li><p>Big speed improvement for <code><a href="../reference/eucast_rules.html">eucast_rules()</a></code></p></li>
|
||||
<li><p>Overall speed improvement by tweaking joining functions</p></li>
|
||||
<li><p>Function <code><a href="../reference/mo_property.html">mo_shortname()</a></code> now returns the genus for input where the species is unknown</p></li>
|
||||
|
Before Width: | Height: | Size: 56 KiB |
@ -12,7 +12,7 @@ articles:
|
||||
datasets: datasets.html
|
||||
resistance_predict: resistance_predict.html
|
||||
welcome_to_AMR: welcome_to_AMR.html
|
||||
last_built: 2021-12-06T10:09Z
|
||||
last_built: 2021-12-12T10:02Z
|
||||
urls:
|
||||
reference: https://msberends.github.io/AMR/reference
|
||||
article: https://msberends.github.io/AMR/articles
|
||||
|
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Deprecated Functions — AMR-deprecated • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Deprecated Functions — AMR-deprecated"><meta property="og:description" content="These functions are so-called 'Deprecated'. They will be removed in a future release. Using the functions will give a warning with the name of the function it has been replaced by (if there is one)."><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Deprecated Functions — AMR-deprecated • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Deprecated Functions — AMR-deprecated"><meta property="og:description" content="These functions are so-called 'Deprecated'. They will be removed in a future release. Using the functions will give a warning with the name of the function it has been replaced by (if there is one)."><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>The AMR Package — AMR • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="The AMR Package — AMR"><meta property="og:description" content="Welcome to the AMR package."><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>The AMR Package — AMR • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="The AMR Package — AMR"><meta property="og:description" content="Welcome to the AMR package."><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>WHOCC: WHO Collaborating Centre for Drug Statistics Methodology — WHOCC • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="WHOCC: WHO Collaborating Centre for Drug Statistics Methodology — WHOCC"><meta property="og:description" content="All antimicrobial drugs and their official names, ATC codes, ATC groups and defined daily dose (DDD) are included in this package, using the WHO Collaborating Centre for Drug Statistics Methodology."><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>WHOCC: WHO Collaborating Centre for Drug Statistics Methodology — WHOCC • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="WHOCC: WHO Collaborating Centre for Drug Statistics Methodology — WHOCC"><meta property="og:description" content="All antimicrobial drugs and their official names, ATC codes, ATC groups and defined daily dose (DDD) are included in this package, using the WHO Collaborating Centre for Drug Statistics Methodology."><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Data Set with 500 Isolates - WHONET Example — WHONET • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Data Set with 500 Isolates - WHONET Example — WHONET"><meta property="og:description" content="This example data set has the exact same structure as an export file from WHONET. Such files can be used with this package, as this example data set shows. The antibiotic results are from our example_isolates data set. All patient names are created using online surname generators and are only in place for practice purposes."><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Data Set with 500 Isolates - WHONET Example — WHONET • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Data Set with 500 Isolates - WHONET Example — WHONET"><meta property="og:description" content="This example data set has the exact same structure as an export file from WHONET. Such files can be used with this package, as this example data set shows. The antibiotic results are from our example_isolates data set. All patient names are created using online surname generators and are only in place for practice purposes."><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Retrieve Antimicrobial Drug Names and Doses from Clinical Text — ab_from_text • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Retrieve Antimicrobial Drug Names and Doses from Clinical Text — ab_from_text"><meta property="og:description" content="Use this function on e.g. clinical texts from health care records. It returns a list with all antimicrobial drugs, doses and forms of administration found in the texts."><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Retrieve Antimicrobial Drug Names and Doses from Clinical Text — ab_from_text • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Retrieve Antimicrobial Drug Names and Doses from Clinical Text — ab_from_text"><meta property="og:description" content="Use this function on e.g. clinical texts from health care records. It returns a list with all antimicrobial drugs, doses and forms of administration found in the texts."><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9062</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
|
@ -1,5 +1,5 @@
|
||||
<!DOCTYPE html>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Get Properties of an Antibiotic — ab_property • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Get Properties of an Antibiotic — ab_property"><meta property="og:description" content="Use these functions to return a specific property of an antibiotic from the antibiotics data set. All input values will be evaluated internally with as.ab()."><meta property="og:image" content="https://msberends.github.io/AMR/logo.png"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<!-- Generated by pkgdown: do not edit by hand --><html lang="en"><head><meta http-equiv="Content-Type" content="text/html; charset=UTF-8"><meta charset="utf-8"><meta http-equiv="X-UA-Compatible" content="IE=edge"><meta name="viewport" content="width=device-width, initial-scale=1.0"><title>Get Properties of an Antibiotic — ab_property • AMR (for R)</title><!-- favicons --><link rel="icon" type="image/png" sizes="16x16" href="../favicon-16x16.png"><link rel="icon" type="image/png" sizes="32x32" href="../favicon-32x32.png"><link rel="apple-touch-icon" type="image/png" sizes="180x180" href="../apple-touch-icon.png"><link rel="apple-touch-icon" type="image/png" sizes="120x120" href="../apple-touch-icon-120x120.png"><link rel="apple-touch-icon" type="image/png" sizes="76x76" href="../apple-touch-icon-76x76.png"><link rel="apple-touch-icon" type="image/png" sizes="60x60" href="../apple-touch-icon-60x60.png"><!-- jquery --><script src="https://cdnjs.cloudflare.com/ajax/libs/jquery/3.4.1/jquery.min.js" integrity="sha256-CSXorXvZcTkaix6Yvo6HppcZGetbYMGWSFlBw8HfCJo=" crossorigin="anonymous"></script><!-- Bootstrap --><link href="https://cdnjs.cloudflare.com/ajax/libs/bootswatch/3.4.0/flatly/bootstrap.min.css" rel="stylesheet" crossorigin="anonymous"><script src="https://cdnjs.cloudflare.com/ajax/libs/twitter-bootstrap/3.4.1/js/bootstrap.min.js" integrity="sha256-nuL8/2cJ5NDSSwnKD8VqreErSWHtnEP9E7AySL+1ev4=" crossorigin="anonymous"></script><!-- bootstrap-toc --><link rel="stylesheet" href="../bootstrap-toc.css"><script src="../bootstrap-toc.js"></script><!-- Font Awesome icons --><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/all.min.css" integrity="sha256-mmgLkCYLUQbXn0B1SRqzHar6dCnv9oZFPEC1g1cwlkk=" crossorigin="anonymous"><link rel="stylesheet" href="https://cdnjs.cloudflare.com/ajax/libs/font-awesome/5.12.1/css/v4-shims.min.css" integrity="sha256-wZjR52fzng1pJHwx4aV2AO3yyTOXrcDW7jBpJtTwVxw=" crossorigin="anonymous"><!-- clipboard.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/clipboard.js/2.0.6/clipboard.min.js" integrity="sha256-inc5kl9MA1hkeYUt+EC3BhlIgyp/2jDIyBLS6k3UxPI=" crossorigin="anonymous"></script><!-- headroom.js --><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/headroom.min.js" integrity="sha256-AsUX4SJE1+yuDu5+mAVzJbuYNPHj/WroHuZ8Ir/CkE0=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/headroom/0.11.0/jQuery.headroom.min.js" integrity="sha256-ZX/yNShbjqsohH1k95liqY9Gd8uOiE1S4vZc+9KQ1K4=" crossorigin="anonymous"></script><!-- pkgdown --><link href="../pkgdown.css" rel="stylesheet"><script src="../pkgdown.js"></script><link href="../extra.css" rel="stylesheet"><script src="../extra.js"></script><meta property="og:title" content="Get Properties of an Antibiotic — ab_property"><meta property="og:description" content="Use these functions to return a specific property of an antibiotic from the antibiotics data set. All input values will be evaluated internally with as.ab()."><meta property="og:image" content="https://msberends.github.io/AMR/logo.svg"><meta name="twitter:card" content="summary_large_image"><meta name="twitter:creator" content="@msberends"><meta name="twitter:site" content="@univgroningen"><!-- mathjax --><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/MathJax.js" integrity="sha256-nvJJv9wWKEm88qvoQl9ekL2J+k/RWIsaSScxxlsrv8k=" crossorigin="anonymous"></script><script src="https://cdnjs.cloudflare.com/ajax/libs/mathjax/2.7.5/config/TeX-AMS-MML_HTMLorMML.js" integrity="sha256-84DKXVJXs0/F8OTMzX4UR909+jtl4G7SPypPavF+GfA=" crossorigin="anonymous"></script><!--[if lt IE 9]>
|
||||
<script src="https://oss.maxcdn.com/html5shiv/3.7.3/html5shiv.min.js"></script>
|
||||
<script src="https://oss.maxcdn.com/respond/1.4.2/respond.min.js"></script>
|
||||
<![endif]--></head><body data-spy="scroll" data-target="#toc">
|
||||
@ -17,7 +17,7 @@
|
||||
</button>
|
||||
<span class="navbar-brand">
|
||||
<a class="navbar-link" href="../index.html">AMR (for R)</a>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9064</span>
|
||||
<span class="version label label-default" data-toggle="tooltip" data-placement="bottom" title="Released version">1.7.1.9068</span>
|
||||
</span>
|
||||
</div>
|
||||
|
||||
@ -161,7 +161,7 @@
|
||||
<p>Use these functions to return a specific property of an antibiotic from the <a href="antibiotics.html">antibiotics</a> data set. All input values will be evaluated internally with <code><a href="as.ab.html">as.ab()</a></code>.</p>
|
||||
</div>
|
||||
|
||||
<div id="ref-usage">Usage,<div class="sourceCode"><pre class="sourceCode r"><code><span class="fu">ab_name</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_locale</a></span><span class="op">(</span><span class="op">)</span>, tolower <span class="op">=</span> <span class="cn">FALSE</span>, <span class="va">...</span><span class="op">)</span>
|
||||
<div id="ref-usage">Usage,<div class="sourceCode"><pre class="sourceCode r"><code><span class="fu">ab_name</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_AMR_locale</a></span><span class="op">(</span><span class="op">)</span>, tolower <span class="op">=</span> <span class="cn">FALSE</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_cid</span><span class="op">(</span><span class="va">x</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
@ -169,13 +169,13 @@
|
||||
|
||||
<span class="fu">ab_tradenames</span><span class="op">(</span><span class="va">x</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_group</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
<span class="fu">ab_group</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_AMR_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_atc</span><span class="op">(</span><span class="va">x</span>, only_first <span class="op">=</span> <span class="cn">FALSE</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_atc_group1</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
<span class="fu">ab_atc_group1</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_AMR_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_atc_group2</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
<span class="fu">ab_atc_group2</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_AMR_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_loinc</span><span class="op">(</span><span class="va">x</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
@ -183,17 +183,17 @@
|
||||
|
||||
<span class="fu">ab_ddd_units</span><span class="op">(</span><span class="va">x</span>, administration <span class="op">=</span> <span class="st">"oral"</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_info</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
<span class="fu">ab_info</span><span class="op">(</span><span class="va">x</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_AMR_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_url</span><span class="op">(</span><span class="va">x</span>, open <span class="op">=</span> <span class="cn">FALSE</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">ab_property</span><span class="op">(</span><span class="va">x</span>, property <span class="op">=</span> <span class="st">"name"</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
<span class="fu">ab_property</span><span class="op">(</span><span class="va">x</span>, property <span class="op">=</span> <span class="st">"name"</span>, language <span class="op">=</span> <span class="fu"><a href="translate.html">get_AMR_locale</a></span><span class="op">(</span><span class="op">)</span>, <span class="va">...</span><span class="op">)</span>
|
||||
|
||||
<span class="fu">set_ab_names</span><span class="op">(</span>
|
||||
<span class="va">data</span>,
|
||||
<span class="va">...</span>,
|
||||
property <span class="op">=</span> <span class="st">"name"</span>,
|
||||
language <span class="op">=</span> <span class="fu"><a href="translate.html">get_locale</a></span><span class="op">(</span><span class="op">)</span>,
|
||||
language <span class="op">=</span> <span class="fu"><a href="translate.html">get_AMR_locale</a></span><span class="op">(</span><span class="op">)</span>,
|
||||
snake_case <span class="op">=</span> <span class="cn">NULL</span>
|
||||
<span class="op">)</span></code></pre></div></div>
|
||||
|
||||
@ -202,7 +202,7 @@
|
||||
<dl><dt>x</dt>
|
||||
<dd><p>any (vector of) text that can be coerced to a valid antibiotic code with <code><a href="as.ab.html">as.ab()</a></code></p></dd>
|
||||
<dt>language</dt>
|
||||
<dd><p>language of the returned text, defaults to system language (see <code><a href="translate.html">get_locale()</a></code>) and can also be set with <code>getOption("AMR_locale")</code>. Use <code>language = NULL</code> or <code>language = ""</code> to prevent translation.</p></dd>
|
||||
<dd><p>language of the returned text, defaults to system language (see <code><a href="translate.html">get_AMR_locale()</a></code>) and can also be set with <code>getOption("AMR_locale")</code>. Use <code>language = NULL</code> or <code>language = ""</code> to prevent translation.</p></dd>
|
||||
<dt>tolower</dt>
|
||||
<dd><p>a <a href="https://rdrr.io/r/base/logical.html" class="external-link">logical</a> to indicate whether the first <a href="https://rdrr.io/r/base/character.html" class="external-link">character</a> of every output should be transformed to a lower case <a href="https://rdrr.io/r/base/character.html" class="external-link">character</a>. This will lead to e.g. "polymyxin B" and not "polymyxin b".</p></dd>
|
||||
<dt>...</dt>
|
||||
|