diff --git a/.github/workflows/codecovr.yaml b/.github/workflows/codecovr.yaml index beff5296..4875f2d1 100644 --- a/.github/workflows/codecovr.yaml +++ b/.github/workflows/codecovr.yaml @@ -22,7 +22,6 @@ on: push: branches: - - premaster - master pull_request: branches: diff --git a/DESCRIPTION b/DESCRIPTION index 7ea7e8ba..1b2670a2 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,6 +1,6 @@ Package: AMR -Version: 1.2.0.9036 -Date: 2020-07-22 +Version: 1.2.0.9037 +Date: 2020-07-28 Title: Antimicrobial Resistance Analysis Authors@R: c( person(role = c("aut", "cre"), diff --git a/NEWS.md b/NEWS.md index c3ddc446..86dee2cd 100755 --- a/NEWS.md +++ b/NEWS.md @@ -1,9 +1,9 @@ -# AMR 1.2.0.9036 -## Last updated: 22 July 2020 +# AMR 1.2.0.9037 +## Last updated: 28 July 2020 ### New * Function `ab_from_text()` to retrieve antimicrobial drug names, doses and forms of administration from clinical texts in e.g. health care records, which also corrects for misspelling since it uses `as.ab()` internally -* [Tidyverse selections](https://tidyselect.r-lib.org/reference/language.html) for antibiotic classes, that help to select the columns of antibiotics that are of a specific antibiotic class, without the need to define the columns or antibiotic abbreviations. They can be used in any function that allows Tidyverse selections, like `dplyr::select()` and `tidyr::pivot_longer()`: +* [Tidyverse selection helpers](https://tidyselect.r-lib.org/reference/language.html) for antibiotic classes, that help to select the columns of antibiotics that are of a specific antibiotic class, without the need to define the columns or antibiotic abbreviations. They can be used in any function that allows selection helpers, like `dplyr::select()` and `tidyr::pivot_longer()`: ```r library(dplyr) @@ -33,13 +33,17 @@ * The `as.ab()` function will now throw a note if more than 1 antimicrobial drug could be retrieved from a single input value. * Fixed a bug where `eucast_rules()` would not work on a tibble when the `tibble` or `dplyr` package was loaded * All `*_join_microorganisms()` functions and `bug_drug_combinations()` now return the original data class (e.g. `tibble`s and `data.table`s) -* Fixed a bug for using grouped versions of `rsi_df()`, `proportion_df()` and `count_df()`, and fixed a bug where not all different antimicrobial results were added as rows +* For functions `rsi_df()`, `proportion_df()` and `count_df()`: + * Fixed a bug for using grouped versions + * Fixed a bug where not all different antimicrobial results were added as rows + * Fixed a bug when only calculating counts (`count_df()`) when all antibiotics in the data set have only `NA`s * Improved auto-determination for columns of types `` and `` * Fixed a bug in `bug_drug_combinations()` for when only one antibiotic was in the input data * Changed the summary for class ``, to highlight the %SI vs. %R * Improved error handling, giving more useful info when functions return an error * Any progress bar will now only show in interactive mode (i.e. not in R Markdown) * Speed improvement for `mdro()` and `filter_ab_class()` +* New option `arrows_textangled` for `ggplot_pca()` to indicate whether the text at the end of the arrows should be angled (defaults to `TRUE`, as it was in previous versions) ### Other * Moved primary location of this project from GitLab to [GitHub](https://github.com/msberends/AMR), giving us native support for automated syntax checking without being dependent on external services such as AppVeyor and Travis CI. diff --git a/R/aa_helper_functions.R b/R/aa_helper_functions.R index 8574bcd3..510e0c3e 100755 --- a/R/aa_helper_functions.R +++ b/R/aa_helper_functions.R @@ -72,6 +72,15 @@ addin_insert_like <- function() { } check_dataset_integrity <- function() { + # check if user overwrote our data sets in their global environment + data_in_pkg <- data(package = "AMR", envir = asNamespace("AMR"))$results[, "Item", drop = TRUE] + data_in_globalenv <- ls(envir = globalenv()) + overwritten <- data_in_pkg[data_in_pkg %in% data_in_globalenv] + stop_if(length(overwritten) > 0, + "the following data set is overwritten by your global environment and prevents the AMR package from working correctly:\n", + paste0("'", overwritten, "'", collapse = ", "), + ".\nPlease rename your object before using this function.", call = FALSE) + # check if other packages did not overwrite our data sets tryCatch({ check_microorganisms <- all(c("mo", "fullname", "kingdom", "phylum", "class", "order", "family", "genus", @@ -86,13 +95,6 @@ check_dataset_integrity <- function() { }, error = function(e) stop_('please use the command \'library("AMR")\' before using this function, to load the required reference data.', call = FALSE) ) - data_in_pkg <- data(package = "AMR", envir = asNamespace("AMR"))$results[, "Item"] - data_in_globalenv <- ls(envir = globalenv()) - overwritten <- data_in_pkg[data_in_pkg %in% data_in_globalenv] - stop_if(length(overwritten) > 0, - "the following data set is overwritten by your global environment and prevents the AMR package from working correctly:\n", - paste0("'", overwritten, "'", collapse = ", "), - ".\nPlease rename your object before using this function.", call = FALSE) invisible(TRUE) } diff --git a/R/amr.R b/R/amr.R index 9001b314..9a212237 100644 --- a/R/amr.R +++ b/R/amr.R @@ -23,12 +23,14 @@ #' #' Welcome to the `AMR` package. #' @details -#' `AMR` is a free and open-source R package to simplify the analysis and prediction of Antimicrobial Resistance (AMR) and to work with microbial and antimicrobial properties by using evidence-based methods. It supports any table format, including WHONET/EARS-Net data. -#' -#' We created this package for both academic research and routine analysis at the Faculty of Medical Sciences of the University of Groningen and the Medical Microbiology & Infection Prevention (MMBI) department of the University Medical Center Groningen (UMCG). This R package is actively maintained and free software; you can freely use and distribute it for both personal and commercial (but not patent) purposes under the terms of the GNU General Public License version 2.0 (GPL-2), as published by the Free Software Foundation. +#' `AMR` is a free, open-source and independent R package 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. Our aim is to provide a standard for clean and reproducible antimicrobial resistance data analysis, that can therefore empower epidemiological analyses to continuously enable surveillance and treatment evaluation in any setting. +#' +#' After installing this package, R knows ~70,000 distinct microbial species and all ~550 antibiotic, antimycotic and antiviral drugs by name and code (including ATC, EARS-NET, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data. +#' +#' 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.0 (April 2013). It was designed to work in any setting, including those with very limited resources. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the University of Groningen, in collaboration with non-profit organisations Certe Medical Diagnostics and Advice and University Medical Center Groningen. This R package is actively maintained and free software; you can freely use and distribute it for both personal and commercial (but not patent) purposes under the terms of the GNU General Public License version 2.0 (GPL-2), as published by the Free Software Foundation. #' #' This package can be used for: -#' - Reference for the taxonomy of microorganisms, since the package contains all microbial (sub)species from the [Catalogue of Life](http://www.catalogueoflife.org) +#' - Reference for the taxonomy of microorganisms, since the package contains all microbial (sub)species from the Catalogue of Life and List of Prokaryotic names with Standing in Nomenclature #' - Interpreting raw MIC and disk diffusion values, based on the latest CLSI or EUCAST guidelines #' - Retrieving antimicrobial drug names, doses and forms of administration from clinical health care records #' - Determining first isolates to be used for AMR analysis @@ -37,15 +39,16 @@ #' - Calculating (empirical) susceptibility of both mono therapy and combination therapies #' - Predicting future antimicrobial resistance using regression models #' - Getting properties for any microorganism (like Gram stain, species, genus or family) -#' - Getting properties for any antibiotic (like name, EARS-Net code, ATC code, PubChem code, defined daily dose or trade name) +#' - Getting properties for any antibiotic (like name, code of EARS-Net/ATC/LOINC/PubChem, defined daily dose or trade name) #' - Plotting antimicrobial resistance -#' - Getting SNOMED codes of a microorganism, or get its name associated with a SNOMED code -#' - Getting LOINC codes of an antibiotic, or get its name associated with a LOINC code +#' - Applying EUCAST expert rules +#' - Getting SNOMED codes of a microorganism, or getting properties of a microorganism based on a SNOMED code +#' - Getting LOINC codes of an antibiotic, or getting properties of an antibiotic based on a LOINC code #' - Machine reading the EUCAST and CLSI guidelines from 2011-2020 to translate MIC values and disk diffusion diameters to R/SI #' - Principal component analysis for AMR - +#' #' @section Read more on our website!: -#' On our website you can find [a comprehensive tutorial](https://msberends.github.io/AMR/articles/AMR.html) about how to conduct AMR analysis, the [complete documentation of all functions](https://msberends.github.io/AMR/reference) (which reads a lot easier than here in R) and [an example analysis using WHONET data](https://msberends.github.io/AMR/articles/WHONET.html). +#' On our website you can find [a comprehensive tutorial](https://msberends.github.io/AMR/articles/AMR.html) about how to conduct AMR analysis, the [complete documentation of all functions](https://msberends.github.io/AMR/reference) (which reads a lot easier than here in R) and [an example analysis using WHONET data](https://msberends.github.io/AMR/articles/WHONET.html). As we would like to better understand the backgrounds and needs of our users, please [participate in our survey](https://msberends.github.io/AMR/survey.html)! #' @section Contact Us: #' For suggestions, comments or questions, please contact us at: #' diff --git a/R/filter_ab_class.R b/R/filter_ab_class.R index de0130e0..165814b0 100644 --- a/R/filter_ab_class.R +++ b/R/filter_ab_class.R @@ -33,8 +33,7 @@ #' @seealso [antibiotic_class_selectors()] for the `select()` equivalent. #' @export #' @examples -#' \dontrun{ -#' library(dplyr) +#' if (require(dplyr)) { #' #' # filter on isolates that have any result for any aminoglycoside #' example_isolates %>% filter_ab_class("aminoglycoside") @@ -64,6 +63,12 @@ #' filter_aminoglycosides("R", "all") %>% #' filter_fluoroquinolones("R", "all") #' } +#' +#' \dontrun{ +#' # with dplyr 1.0.0 and higher (that adds 'across()'), this is equal: +#' example_isolates %>% filter_carbapenems("R", "all") +#' example_isolates %>% filter(across(carbapenems(), ~. == "R")) +#' } filter_ab_class <- function(x, ab_class, result = NULL, diff --git a/R/ggplot_pca.R b/R/ggplot_pca.R index 4f9e7c60..ad4a6f82 100755 --- a/R/ggplot_pca.R +++ b/R/ggplot_pca.R @@ -40,6 +40,7 @@ #' @param arrows_colour the colour of the arrow and their text #' @param arrows_size the size (thickness) of the arrow lines #' @param arrows_textsize the size of the text at the end of the arrows +#' @param arrows_textangled a logical whether the text at the end of the arrows should be angled #' @param arrows_alpha the alpha (transparency) of the arrows and their text #' @param base_textsize the text size for all plot elements except the labels and arrows #' @param ... Parameters passed on to functions @@ -58,20 +59,25 @@ #' # `example_isolates` is a dataset available in the AMR package. #' # See ?example_isolates. #' -#' \dontrun{ #' # See ?pca for more info about Principal Component Analysis (PCA). -#' library(dplyr) -#' pca_model <- example_isolates %>% -#' filter(mo_genus(mo) == "Staphylococcus") %>% -#' group_by(species = mo_shortname(mo)) %>% -#' summarise_if (is.rsi, resistance) %>% -#' pca(FLC, AMC, CXM, GEN, TOB, TMP, SXT, CIP, TEC, TCY, ERY) +#' if (require("dplyr")) { +#' pca_model <- example_isolates %>% +#' filter(mo_genus(mo) == "Staphylococcus") %>% +#' group_by(species = mo_shortname(mo)) %>% +#' summarise_if (is.rsi, resistance) %>% +#' pca(FLC, AMC, CXM, GEN, TOB, TMP, SXT, CIP, TEC, TCY, ERY) +#' +#' # old (base R) +#' biplot(pca_model) #' -#' # old -#' biplot(pca_model) -#' -#' # new -#' ggplot_pca(pca_model) +#' # new +#' ggplot_pca(pca_model) +#' +#' if (require("ggplot2")) { +#' ggplot_pca(pca_model) + +#' scale_colour_viridis_d() + +#' labs(title = "Title here") +#' } #' } ggplot_pca <- function(x, choices = 1:2, @@ -91,26 +97,28 @@ ggplot_pca <- function(x, arrows_colour = "darkblue", arrows_size = 0.5, arrows_textsize = 3, + arrows_textangled = TRUE, arrows_alpha = 0.75, base_textsize = 10, ...) { stop_ifnot_installed("ggplot2") stop_ifnot(length(choices) == 2, "`choices` must be of length 2") - stop_ifnot(is.logical(scale), "`scale` must be TRUE or FALSE") - stop_ifnot(is.logical(pc.biplot), "`pc.biplot` must be TRUE or FALSE") - stop_ifnot(is.numeric(choices), "`choices` must be numeric") - stop_ifnot(is.numeric(labels_textsize), "`labels_textsize` must be numeric") - stop_ifnot(is.numeric(labels_text_placement), "`labels_text_placement` must be numeric") - stop_ifnot(is.logical(ellipse), "`ellipse` must be TRUE or FALSE") - stop_ifnot(is.numeric(ellipse_prob), "`ellipse_prob` must be numeric") - stop_ifnot(is.numeric(ellipse_size), "`ellipse_size` must be numeric") - stop_ifnot(is.numeric(ellipse_alpha), "`ellipse_alpha` must be numeric") stop_ifnot(is.logical(arrows), "`arrows` must be TRUE or FALSE") + stop_ifnot(is.logical(arrows_textangled), "`arrows_textangled` must be TRUE or FALSE") + stop_ifnot(is.logical(ellipse), "`ellipse` must be TRUE or FALSE") + stop_ifnot(is.logical(pc.biplot), "`pc.biplot` must be TRUE or FALSE") + stop_ifnot(is.logical(scale), "`scale` must be TRUE or FALSE") + stop_ifnot(is.numeric(arrows_alpha), "`arrows_alpha` must be numeric") stop_ifnot(is.numeric(arrows_size), "`arrows_size` must be numeric") stop_ifnot(is.numeric(arrows_textsize), "`arrows_textsize` must be numeric") - stop_ifnot(is.numeric(arrows_alpha), "`arrows_alpha` must be numeric") stop_ifnot(is.numeric(base_textsize), "`base_textsize` must be numeric") + stop_ifnot(is.numeric(choices), "`choices` must be numeric") + stop_ifnot(is.numeric(ellipse_alpha), "`ellipse_alpha` must be numeric") + stop_ifnot(is.numeric(ellipse_prob), "`ellipse_prob` must be numeric") + stop_ifnot(is.numeric(ellipse_size), "`ellipse_size` must be numeric") + stop_ifnot(is.numeric(labels_text_placement), "`labels_text_placement` must be numeric") + stop_ifnot(is.numeric(labels_textsize), "`labels_textsize` must be numeric") calculations <- pca_calculations(pca_model = x, groups = groups, @@ -206,12 +214,20 @@ ggplot_pca <- function(x, type = "open"), colour = arrows_colour, size = arrows_size, - alpha = arrows_alpha) + - ggplot2::geom_text(data = df.v, - ggplot2::aes(label = varname, x = xvar, y = yvar, angle = angle, hjust = hjust), - colour = arrows_colour, - size = arrows_textsize, - alpha = arrows_alpha) + alpha = arrows_alpha) + if (arrows_textangled == TRUE) { + g <- g + ggplot2::geom_text(data = df.v, + ggplot2::aes(label = varname, x = xvar, y = yvar, angle = angle, hjust = hjust), + colour = arrows_colour, + size = arrows_textsize, + alpha = arrows_alpha) + } else { + g <- g + ggplot2::geom_text(data = df.v, + ggplot2::aes(label = varname, x = xvar, y = yvar, hjust = hjust), + colour = arrows_colour, + size = arrows_textsize, + alpha = arrows_alpha) + } } # Add caption label about total explained variance diff --git a/R/rsi.R b/R/rsi.R index fa8d8a86..5a566a63 100755 --- a/R/rsi.R +++ b/R/rsi.R @@ -37,7 +37,7 @@ #' #' Supported guidelines to be used as input for the `guideline` parameter are: `r paste0('"', sort(unique(AMR::rsi_translation$guideline)), '"', collapse = ", ")`. Simply using `"CLSI"` or `"EUCAST"` for input will automatically select the latest version of that guideline. #' -#' The repository of this package [contains a machine readable version](https://github.com/msberends/AMR/blob/master/data-raw/rsi_translation.txt) of all guidelines. This is a CSV file consisting of `r format(nrow(AMR::rsi_translation), big.mark = ",")` rows and `r ncol(AMR::rsi_translation)` columns. This file is machine readable, since it contains one row for every unique combination of the test method (MIC or disk diffusion), the antimicrobial agent and the microorganism. This **allows for easy implementation of these rules in laboratory information systems (LIS)**. +#' The repository of this package [contains a machine readable version](https://github.com/msberends/AMR/blob/master/data-raw/rsi_translation.txt) of all guidelines. This is a CSV file consisting of `r format(nrow(AMR::rsi_translation), big.mark = ",")` rows and `r ncol(AMR::rsi_translation)` columns. This file is machine readable, since it contains one row for every unique combination of the test method (MIC or disk diffusion), the antimicrobial agent and the microorganism. **This allows for easy implementation of these rules in laboratory information systems (LIS)**. #' #' After using [as.rsi()], you can use [eucast_rules()] to (1) apply inferred susceptibility and resistance based on results of other antimicrobials and (2) apply intrinsic resistance based on taxonomic properties of a microorganism. #' diff --git a/R/rsi_calc.R b/R/rsi_calc.R index 7eb9fb0c..7136fd1a 100755 --- a/R/rsi_calc.R +++ b/R/rsi_calc.R @@ -214,7 +214,7 @@ rsi_calc_df <- function(type, # "proportion", "count" or "both" out <- data.frame(antibiotic = character(0), interpretation = character(0), value = double(0), - isolates <- integer(0), + isolates = integer(0), stringsAsFactors = FALSE) if (data_has_groups) { group_values <- unique(.data[, which(colnames(.data) %in% groups), drop = FALSE]) diff --git a/R/sysdata.rda b/R/sysdata.rda index 55f0a9e1..539ecb67 100644 Binary files a/R/sysdata.rda and b/R/sysdata.rda differ diff --git a/README.md b/README.md index 17155054..21d1b4b7 100755 --- a/README.md +++ b/README.md @@ -3,7 +3,13 @@ # `AMR` (for R) -This is the development source of the `AMR` package for R. Not a developer? Then please visit our website [https://msberends.github.io/AMR](https://msberends.github.io/AMR) to read about this package. +`AMR` is a free, open-source and independent R package 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. Our aim is to provide a standard for clean and reproducible antimicrobial resistance data analysis, that can therefore empower epidemiological analyses to continuously enable surveillance and treatment evaluation in any setting. + +After installing this package, R knows ~70,000 distinct microbial species and all ~550 antibiotic, antimycotic and antiviral drugs by name and code (including ATC, EARS-NET, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data. + +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.0 (April 2013). It was designed to work in any setting, including those with very limited resources. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the University of Groningen, in collaboration with non-profit organisations Certe Medical Diagnostics and Advice and University Medical Center Groningen. This R package is actively maintained and free software; you can freely use and distribute it for both personal and commercial (but not patent) purposes under the terms of the GNU General Public License version 2.0 (GPL-2), as published by the Free Software Foundation. + +This is the development source of the `AMR` package for R. Not a developer? Then please visit our website [https://msberends.github.io/AMR](https://msberends.github.io/AMR) to read more about this package. *NOTE: this source code is on GitHub (https://github.com/msberends/AMR), but also automatically mirrored to GitLab (https://gitlab.com/msberends/AMR).* diff --git a/_pkgdown.yml b/_pkgdown.yml index abde494b..81d368a5 100644 --- a/_pkgdown.yml +++ b/_pkgdown.yml @@ -70,20 +70,20 @@ navbar: href: "articles/benchmarks.html" - text: "Manual" icon: "fa-book-open" - href: "reference/" + href: "reference/index.html" - text: "Authors" icon: "fa-users" href: "authors.html" - text: "Changelog" icon: "far fa-newspaper" - href: "news/" + href: "news/index.html" right: - text: "Source Code" icon: "fab fa-github" href: "https://github.com/msberends/AMR" - - text: "Licence" - icon: "fa-book" - href: "LICENSE-text.html" + - text: "Survey" + icon: "fa-clipboard-list" + href: "survey.html" reference: - title: "Cleaning your data" @@ -156,7 +156,7 @@ reference: - "`catalogue_of_life_version`" - "`WHOCC`" - "`lifecycle`" - - title: Other functions + - title: "Other functions" desc: > These functions are mostly for internal use, but some of them may also be suitable for your analysis. Especially the @@ -164,7 +164,7 @@ reference: contents: - "`get_locale`" - "`like`" - - title: Deprecated functions + - title: "Deprecated functions" desc: > These functions are deprecated, meaning that they will still work but show a warning with every use and will be removed diff --git a/data-raw/create_survey_page.R b/data-raw/create_survey_page.R new file mode 100644 index 00000000..c36f80a8 --- /dev/null +++ b/data-raw/create_survey_page.R @@ -0,0 +1,6 @@ + +license_text <- readLines("docs/LICENSE-text.html") +license_text <- paste(license_text, collapse = "|||") +license_text <- gsub("licen(s|c)e", "Survey", license_text, ignore.case = TRUE) +license_text <- gsub("
.*
", '

If no form is showing below, please click here to open it.

', license_text) +writeLines(unlist(strsplit(license_text, "|||", fixed = TRUE)), "docs/survey.html") diff --git a/data-raw/eucast_rules.tsv b/data-raw/eucast_rules.tsv index cea81413..cada2dbe 100644 --- a/data-raw/eucast_rules.tsv +++ b/data-raw/eucast_rules.tsv @@ -177,7 +177,7 @@ genus_species is Clostridium innocuum VAN R Table 04: Intrinsic resistance in genus_species like ^Streptococcus (pyogenes|agalactiae|dysgalactiae|group A|group B|group C|group G) PEN S aminopenicillins, cephalosporins_except_CAZ, carbapenems S Table 08: Interpretive rules for B-lactam agents and Gram-positive cocci Expert Rules genus is Enterococcus AMP R ureidopenicillins, carbapenems R Table 08: Interpretive rules for B-lactam agents and Gram-positive cocci Expert Rules genus is Enterococcus AMX R ureidopenicillins, carbapenems R Table 08: Interpretive rules for B-lactam agents and Gram-positive cocci Expert Rules -family is Enterobacteriaceae TIC, PIP R, S PIP R Table 09: Interpretive rules for B-lactam agents and Gram-negative rods Expert Rules +order is Enterobacterales TIC, PIP R, S PIP R Table 09: Interpretive rules for B-lactam agents and Gram-negative rods (at the time: Enterobacteriaceae) Expert Rules genus like .* ERY S AZM, CLR S Table 11: Interpretive rules for macrolides, lincosamides, and streptogramins Expert Rules genus like .* ERY I AZM, CLR I Table 11: Interpretive rules for macrolides, lincosamides, and streptogramins Expert Rules genus like .* ERY R AZM, CLR R Table 11: Interpretive rules for macrolides, lincosamides, and streptogramins Expert Rules diff --git a/docs/404.html b/docs/404.html index 6b4c48e9..7d2df2ef 100644 --- a/docs/404.html +++ b/docs/404.html @@ -81,7 +81,7 @@ AMR (for R) - 1.2.0.9036 + 1.2.0.9037 @@ -176,7 +176,7 @@
  • - + Manual @@ -190,7 +190,7 @@
  • - + Changelog @@ -206,10 +206,10 @@
  • - - + + - Licence + Survey
  • diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html index 5a26c8f2..2d1d6b43 100644 --- a/docs/LICENSE-text.html +++ b/docs/LICENSE-text.html @@ -81,7 +81,7 @@ AMR (for R) - 1.2.0.9036 + 1.2.0.9037 @@ -176,7 +176,7 @@
  • - + Manual @@ -190,7 +190,7 @@
  • - + Changelog @@ -206,10 +206,10 @@
  • - - + + - Licence + Survey
  • diff --git a/docs/articles/AMR.html b/docs/articles/AMR.html index 3943c64d..f6101862 100644 --- a/docs/articles/AMR.html +++ b/docs/articles/AMR.html @@ -39,7 +39,7 @@ AMR (for R) - 1.2.0.9030 + 1.2.0.9037 @@ -134,7 +134,7 @@
  • - + Manual @@ -148,7 +148,7 @@
  • - + Changelog @@ -164,10 +164,10 @@
  • - - + + - Licence + Survey
  • @@ -186,7 +186,7 @@

    How to conduct AMR analysis

    Matthijs S. Berends

    -

    09 July 2020

    +

    24 July 2020

    Source: vignettes/AMR.Rmd @@ -195,7 +195,7 @@ -

    Note: values on this page will change with every website update since they are based on randomly created values and the page was written in R Markdown. However, the methodology remains unchanged. This page was generated on 09 July 2020.

    +

    Note: values on this page will change with every website update since they are based on randomly created values and the page was written in R Markdown. However, the methodology remains unchanged. This page was generated on 24 July 2020.

    Introduction

    @@ -226,21 +226,21 @@ -2020-07-09 +2020-07-24 abcd Escherichia coli S S -2020-07-09 +2020-07-24 abcd Escherichia coli S R -2020-07-09 +2020-07-24 efgh Escherichia coli R @@ -336,68 +336,68 @@ -2016-01-30 -Y5 +2014-06-04 +V5 +Hospital B +Escherichia coli +R +S +S +S +F + + +2015-09-20 +M6 Hospital A Escherichia coli -S -S -S -S -F - - -2010-11-13 -Y1 -Hospital D -Escherichia coli R S S S -F +M -2016-07-21 -U10 -Hospital B -Escherichia coli -I -S -S -S -F - - -2013-03-14 -Q1 -Hospital B -Staphylococcus aureus -R -R -S -S -F - - -2013-04-22 -O8 -Hospital B -Staphylococcus aureus -S -S -R -S -F - - -2017-11-14 -J4 -Hospital A +2017-05-14 +Q6 +Hospital C Streptococcus pneumoniae +R S S S +F + + +2017-03-12 +O3 +Hospital D +Klebsiella pneumoniae +S +R +S +S +F + + +2017-12-27 +P8 +Hospital B +Escherichia coli +S +S +S +S +F + + +2013-11-30 +B10 +Hospital B +Staphylococcus aureus +I +S +S S M @@ -432,18 +432,18 @@ Longest: 1

    1 M -10,300 -51.5% -10,300 -51.5% +10,487 +52.44% +10,487 +52.44% 2 F -9,700 -48.5% +9,513 +47.57% 20,000 -100.0% +100.00% @@ -481,7 +481,7 @@ Longest: 1

    # NOTE: Using column `bacteria` as input for `col_mo`. # NOTE: Using column `date` as input for `col_date`. # NOTE: Using column `patient_id` as input for `col_patient_id`.
    -

    So only 28.5% is suitable for resistance analysis! We can now filter on it with the filter() function, also from the dplyr package:

    +

    So only 28.4% is suitable for resistance analysis! We can now filter on it with the filter() function, also from the dplyr package:

    data_1st <- data %>%
       filter(first == TRUE)

    For future use, the above two syntaxes can be shortened with the filter_first_isolate() function:

    @@ -491,7 +491,7 @@ Longest: 1

    First weighted isolates

    -

    We made a slight twist to the CLSI algorithm, to take into account the antimicrobial susceptibility profile. Have a look at all isolates of patient Y2, sorted on date:

    +

    We made a slight twist to the CLSI algorithm, to take into account the antimicrobial susceptibility profile. Have a look at all isolates of patient J1, sorted on date:

    @@ -507,19 +507,19 @@ Longest: 1

    - - + + - - + + - - + + @@ -529,21 +529,21 @@ Longest: 1

    - - + + - - + + - - + + - + @@ -551,30 +551,30 @@ Longest: 1

    - - + + - + - - + + - - - - + + + + - - + + @@ -584,19 +584,19 @@ Longest: 1

    - - + + - - + + - - + + @@ -606,14 +606,14 @@ Longest: 1

    - - + + - - + +
    isolate
    12010-03-16Y22010-04-08J1 B_ESCHR_COLI RRRI SR TRUE
    22010-08-04Y22010-06-01J1 B_ESCHR_COLI S S
    32010-10-06Y22010-06-21J1 B_ESCHR_COLIRRSS S S FALSE
    42010-11-11Y22010-07-08J1 B_ESCHR_COLIRS S S S
    52010-11-23Y22011-01-29J1 B_ESCHR_COLI RR SR S FALSE
    62011-04-01Y22011-02-23J1 B_ESCHR_COLIR SRRTRUESSSFALSE
    72011-04-27Y22011-02-23J1 B_ESCHR_COLI S S
    82011-05-27Y22011-02-28J1 B_ESCHR_COLI R SSSRR FALSE
    92011-07-05Y22011-03-13J1 B_ESCHR_COLI S S
    102011-09-25Y22011-05-14J1 B_ESCHR_COLI R RR SFALSESTRUE
    @@ -644,20 +644,20 @@ Longest: 1

    1 -2010-03-16 -Y2 +2010-04-08 +J1 B_ESCHR_COLI R -R -R +I S +R TRUE TRUE 2 -2010-08-04 -Y2 +2010-06-01 +J1 B_ESCHR_COLI S S @@ -668,56 +668,44 @@ Longest: 1

    3 -2010-10-06 -Y2 +2010-06-21 +J1 B_ESCHR_COLI -R -R +S +S S S FALSE -TRUE +FALSE 4 -2010-11-11 -Y2 +2010-07-08 +J1 B_ESCHR_COLI -R +S S S S FALSE -TRUE +FALSE 5 -2010-11-23 -Y2 +2011-01-29 +J1 B_ESCHR_COLI R -R S +R S FALSE TRUE 6 -2011-04-01 -Y2 -B_ESCHR_COLI -R -S -R -R -TRUE -TRUE - - -7 -2011-04-27 -Y2 +2011-02-23 +J1 B_ESCHR_COLI S S @@ -726,22 +714,34 @@ Longest: 1

    FALSE TRUE + +7 +2011-02-23 +J1 +B_ESCHR_COLI +S +S +S +S +FALSE +FALSE + 8 -2011-05-27 -Y2 +2011-02-28 +J1 B_ESCHR_COLI R S -S -S +R +R FALSE TRUE 9 -2011-07-05 -Y2 +2011-03-13 +J1 B_ESCHR_COLI S S @@ -752,23 +752,23 @@ Longest: 1

    10 -2011-09-25 -Y2 +2011-05-14 +J1 B_ESCHR_COLI R R -R S -FALSE +S +TRUE TRUE -

    Instead of 2, now 10 isolates are flagged. In total, 78.3% of all isolates are marked ‘first weighted’ - 49.8% more than when using the CLSI guideline. In real life, this novel algorithm will yield 5-10% more isolates than the classic CLSI guideline.

    +

    Instead of 2, now 7 isolates are flagged. In total, 78.6% of all isolates are marked ‘first weighted’ - 50.2% more than when using the CLSI guideline. In real life, this novel algorithm will yield 5-10% more isolates than the classic CLSI guideline.

    As with filter_first_isolate(), there’s a shortcut for this new algorithm too:

    data_1st <- data %>%
       filter_first_weighted_isolate()
    -

    So we end up with 15,664 isolates for analysis.

    +

    So we end up with 15,719 isolates for analysis.

    We can remove unneeded columns:

    data_1st <- data_1st %>%
       select(-c(first, keyab))
    @@ -776,6 +776,7 @@ Longest: 1

    head(data_1st)
    +@@ -791,6 +792,7 @@ Longest: 1

    + @@ -807,24 +809,10 @@ Longest: 1

    - - - - - - - - - - - - - - - - - - + + + + @@ -836,66 +824,86 @@ Longest: 1

    + + + + + + + + + + + + + + + + - - + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + + - + + + + + + + + + + + + + + + + + - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
    date patient_id hospital
    2016-01-30Y5Hospital AB_ESCHR_COLISSSSFGram-negativeEscherichiacoliTRUE
    2010-11-13Y1Hospital D12014-06-04V5Hospital B B_ESCHR_COLI R S coli TRUE
    32017-05-14Q6Hospital CB_STRPT_PNMNRRSRFGram-positiveStreptococcuspneumoniaeTRUE
    2016-07-21U1042017-03-12O3Hospital DB_KLBSL_PNMNRRSSFGram-negativeKlebsiellapneumoniaeTRUE
    52017-12-27P8 Hospital B B_ESCHR_COLISSSSFGram-negativeEscherichiacoliTRUE
    62013-11-30B10Hospital BB_STPHY_AURS I S S SFMGram-positiveStaphylococcusaureusTRUE
    82011-06-14A2Hospital DB_ESCHR_COLIRRSSM Gram-negative Escherichia coli TRUE
    2013-03-14Q1Hospital BB_STPHY_AURSRRSSFGram-positiveStaphylococcusaureusTRUE
    2013-04-22O8Hospital BB_STPHY_AURSSSRSFGram-positiveStaphylococcusaureusTRUE
    2017-11-14J4Hospital AB_STRPT_PNMNSSSRMGram-positiveStreptococcuspneumoniaeTRUE

    Time for the analysis!

    @@ -915,8 +923,8 @@ Longest: 1

    data_1st %>% freq(genus, species)

    Frequency table

    Class: character
    -Length: 15,664
    -Available: 15,664 (100%, NA: 0 = 0%)
    +Length: 15,719
    +Available: 15,719 (100%, NA: 0 = 0%)
    Unique: 4

    Shortest: 16
    Longest: 24

    @@ -933,33 +941,33 @@ Longest: 24

    1 Escherichia coli -7,860 -50.18% -7,860 -50.18% +7,902 +50.27% +7,902 +50.27% 2 Staphylococcus aureus -3,867 -24.69% -11,727 -74.87% +3,926 +24.98% +11,828 +75.25% 3 Streptococcus pneumoniae -2,386 -15.23% -14,113 -90.10% +2,350 +14.95% +14,178 +90.20% 4 Klebsiella pneumoniae -1,551 -9.90% -15,664 +1,541 +9.80% +15,719 100.00% @@ -986,50 +994,50 @@ Longest: 24

    E. coli AMX -3765 -268 -3827 -7860 +3775 +258 +3869 +7902 E. coli AMC -6198 +6238 319 -1343 -7860 +1345 +7902 E. coli CIP -5971 +6031 0 -1889 -7860 +1871 +7902 E. coli GEN -7088 +7105 0 -772 -7860 +797 +7902 K. pneumoniae AMX 0 0 -1551 -1551 +1541 +1541 K. pneumoniae AMC -1209 -72 -270 -1551 +1230 +43 +268 +1541 @@ -1052,34 +1060,34 @@ Longest: 24

    E. coli CIP -5971 +6031 0 -1889 -7860 +1871 +7902 K. pneumoniae CIP -1192 +1174 0 -359 -1551 +367 +1541 S. aureus CIP -2946 +2993 0 -921 -3867 +933 +3926 S. pneumoniae CIP -1813 +1807 0 -573 -2386 +543 +2350 @@ -1091,7 +1099,7 @@ Longest: 24

    The functions resistance() and susceptibility() can be used to calculate antimicrobial resistance or susceptibility. For more specific analyses, the functions proportion_S(), proportion_SI(), proportion_I(), proportion_IR() and proportion_R() can be used to determine the proportion of a specific antimicrobial outcome.

    As per the EUCAST guideline of 2019, we calculate resistance as the proportion of R (proportion_R(), equal to resistance()) and susceptibility as the proportion of S and I (proportion_SI(), equal to susceptibility()). These functions can be used on their own:

    data_1st %>% resistance(AMX)
    -# [1] 0.5335802
    +# [1] 0.5350213

    Or can be used in conjuction with group_by() and summarise(), both from the dplyr package:

    data_1st %>%
       group_by(hospital) %>%
    @@ -1105,19 +1113,19 @@ Longest: 24

    Hospital A -0.5286835 +0.5308117 Hospital B -0.5301545 +0.5304522 Hospital C -0.5366460 +0.5364381 Hospital D -0.5447207 +0.5479751 @@ -1136,23 +1144,23 @@ Longest: 24

    Hospital A -0.5286835 -4846 +0.5308117 +4706 Hospital B -0.5301545 -5306 +0.5304522 +5484 Hospital C -0.5366460 -2415 +0.5364381 +2319 Hospital D -0.5447207 -3097 +0.5479751 +3210 @@ -1173,27 +1181,27 @@ Longest: 24

    Escherichia -0.8291349 -0.9017812 -0.9870229 +0.8297899 +0.8991395 +0.9851936 Klebsiella -0.8259188 -0.8994197 -0.9890393 +0.8260870 +0.8994160 +0.9883193 Staphylococcus -0.8233773 -0.9229377 -0.9847427 +0.8352012 +0.9238411 +0.9852267 Streptococcus -0.5481978 +0.5425532 0.0000000 -0.5481978 +0.5425532 diff --git a/docs/articles/AMR_files/figure-html/plot 1-1.png b/docs/articles/AMR_files/figure-html/plot 1-1.png index 13c83362..c9f877b7 100644 Binary files a/docs/articles/AMR_files/figure-html/plot 1-1.png and b/docs/articles/AMR_files/figure-html/plot 1-1.png differ diff --git a/docs/articles/AMR_files/figure-html/plot 3-1.png b/docs/articles/AMR_files/figure-html/plot 3-1.png index b5299cb9..1d638c0c 100644 Binary files a/docs/articles/AMR_files/figure-html/plot 3-1.png and b/docs/articles/AMR_files/figure-html/plot 3-1.png differ diff --git a/docs/articles/AMR_files/figure-html/plot 4-1.png b/docs/articles/AMR_files/figure-html/plot 4-1.png index 406c1e5c..4f287779 100644 Binary files a/docs/articles/AMR_files/figure-html/plot 4-1.png and b/docs/articles/AMR_files/figure-html/plot 4-1.png differ diff --git a/docs/articles/AMR_files/figure-html/plot 5-1.png b/docs/articles/AMR_files/figure-html/plot 5-1.png index 49b54965..8bcf53ce 100644 Binary files a/docs/articles/AMR_files/figure-html/plot 5-1.png and b/docs/articles/AMR_files/figure-html/plot 5-1.png differ diff --git a/docs/articles/EUCAST.html b/docs/articles/EUCAST.html index 774397ab..f37a56e8 100644 --- a/docs/articles/EUCAST.html +++ b/docs/articles/EUCAST.html @@ -39,7 +39,7 @@ AMR (for R) - 1.2.0.9030 + 1.2.0.9037
    @@ -134,7 +134,7 @@
  • - + Manual @@ -148,7 +148,7 @@
  • - + Changelog @@ -164,10 +164,10 @@
  • - - + + - Licence + Survey
  • @@ -186,7 +186,7 @@

    How to apply EUCAST rules

    Matthijs S. Berends

    -

    09 July 2020

    +

    24 July 2020

    Source: vignettes/EUCAST.Rmd diff --git a/docs/articles/MDR.html b/docs/articles/MDR.html index 5cdee42d..9ff6aeaf 100644 --- a/docs/articles/MDR.html +++ b/docs/articles/MDR.html @@ -39,7 +39,7 @@ AMR (for R) - 1.2.0.9030 + 1.2.0.9037 @@ -134,7 +134,7 @@
  • - + Manual @@ -148,7 +148,7 @@
  • - + Changelog @@ -164,10 +164,10 @@
  • - - + + - Licence + Survey
  • @@ -186,7 +186,7 @@

    How to determine multi-drug resistance (MDR)

    Matthijs S. Berends

    -

    09 July 2020

    +

    24 July 2020

    Source: vignettes/MDR.Rmd @@ -306,19 +306,19 @@ Unique: 2

    The data set now looks like this:

    head(my_TB_data)
     #   rifampicin isoniazid gatifloxacin ethambutol pyrazinamide moxifloxacin
    -# 1          S         R            R          S            S            I
    -# 2          S         R            S          S            S            S
    -# 3          S         S            S          S            S            S
    -# 4          S         R            S          S            S            R
    -# 5          R         S            S          S            R            R
    -# 6          S         R            I          R            R            S
    +# 1          R         S            S          R            R            R
    +# 2          R         R            R          R            I            S
    +# 3          S         S            S          S            R            S
    +# 4          S         S            R          S            S            S
    +# 5          R         S            R          R            I            S
    +# 6          R         S            R          I            S            S
     #   kanamycin
    -# 1         S
    -# 2         R
    +# 1         R
    +# 2         S
     # 3         R
     # 4         S
     # 5         R
    -# 6         S
    +# 6 R

    We can now add the interpretation of MDR-TB to our data set. You can use:

    mdro(my_TB_data, guideline = "TB")

    or its shortcut mdr_tb():

    @@ -347,32 +347,32 @@ Unique: 5

    1 Mono-resistant -3300 -66.00% -3300 -66.00% +3196 +63.92% +3196 +63.92% 2 Negative -636 -12.72% -3936 -78.72% +694 +13.88% +3890 +77.80% 3 Multi-drug-resistant -561 -11.22% -4497 -89.94% +606 +12.12% +4496 +89.92% 4 Poly-resistant -310 -6.20% +311 +6.22% 4807 96.14% diff --git a/docs/articles/PCA.html b/docs/articles/PCA.html index 41c90855..07714ac4 100644 --- a/docs/articles/PCA.html +++ b/docs/articles/PCA.html @@ -39,7 +39,7 @@ AMR (for R) - 1.2.0.9030 + 1.2.0.9037 @@ -134,7 +134,7 @@
  • - + Manual @@ -148,7 +148,7 @@
  • - + Changelog @@ -164,10 +164,10 @@
  • - - + + - Licence + Survey
  • @@ -186,7 +186,7 @@

    How to conduct principal component analysis (PCA) for AMR

    Matthijs S. Berends

    -

    09 July 2020

    +

    24 July 2020

    Source: vignettes/PCA.Rmd diff --git a/docs/articles/SPSS.html b/docs/articles/SPSS.html index ffb8199c..933a8c2f 100644 --- a/docs/articles/SPSS.html +++ b/docs/articles/SPSS.html @@ -39,7 +39,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -134,7 +134,7 @@
  • - + Manual @@ -148,7 +148,7 @@
  • - + Changelog @@ -164,10 +164,10 @@
  • - - + + - Licence + Survey
  • @@ -186,7 +186,7 @@

    How to import data from SPSS / SAS / Stata

    Matthijs S. Berends

    -

    09 July 2020

    +

    24 July 2020

    Source: vignettes/SPSS.Rmd diff --git a/docs/articles/WHONET.html b/docs/articles/WHONET.html index 550a1924..eda5c4a8 100644 --- a/docs/articles/WHONET.html +++ b/docs/articles/WHONET.html @@ -39,7 +39,7 @@ AMR (for R) - 1.2.0.9033 + 1.2.0.9037 @@ -134,7 +134,7 @@
  • - + Manual @@ -148,7 +148,7 @@
  • - + Changelog @@ -164,10 +164,10 @@
  • - - + + - Licence + Survey
  • @@ -186,7 +186,7 @@

    How to work with WHONET data

    Matthijs S. Berends

    -

    12 July 2020

    +

    24 July 2020

    Source: vignettes/WHONET.Rmd diff --git a/docs/articles/benchmarks.html b/docs/articles/benchmarks.html index b0947807..663d96c5 100644 --- a/docs/articles/benchmarks.html +++ b/docs/articles/benchmarks.html @@ -39,7 +39,7 @@ AMR (for R) - 1.2.0.9030 + 1.2.0.9037 @@ -134,7 +134,7 @@
  • - + Manual @@ -148,7 +148,7 @@
  • - + Changelog @@ -164,10 +164,10 @@
  • - - + + - Licence + Survey
  • @@ -186,7 +186,7 @@

    Benchmarks

    Matthijs S. Berends

    -

    09 July 2020

    +

    24 July 2020

    Source: vignettes/benchmarks.Rmd @@ -221,21 +221,21 @@ times = 10) print(S.aureus, unit = "ms", signif = 2) # Unit: milliseconds -# expr min lq mean median uq max neval -# as.mo("sau") 9.9 14 22 15 36 48 10 -# as.mo("stau") 160.0 160 180 170 210 210 10 -# as.mo("STAU") 160.0 160 180 170 200 210 10 -# as.mo("staaur") 9.5 13 14 14 16 17 10 -# as.mo("STAAUR") 9.7 11 13 13 15 19 10 -# as.mo("S. aureus") 12.0 13 17 15 18 35 10 -# as.mo("S aureus") 11.0 16 26 19 42 43 10 -# as.mo("Staphylococcus aureus") 8.7 11 19 13 14 55 10 -# as.mo("Staphylococcus aureus (MRSA)") 890.0 910 930 920 950 1000 10 -# as.mo("Sthafilokkockus aaureuz") 420.0 430 450 440 470 510 10 -# as.mo("MRSA") 9.8 10 13 12 14 19 10 -# as.mo("VISA") 12.0 14 33 18 43 120 10 -# as.mo("VRSA") 12.0 15 24 17 37 48 10 -# as.mo(22242419) 140.0 150 150 150 150 180 10 +# expr min lq mean median uq max neval +# as.mo("sau") 11 13 16 14 15 38 10 +# as.mo("stau") 170 170 180 180 190 200 10 +# as.mo("STAU") 160 170 190 190 200 210 10 +# as.mo("staaur") 12 13 15 14 15 20 10 +# as.mo("STAAUR") 13 14 17 15 15 38 10 +# as.mo("S. aureus") 13 14 23 17 36 42 10 +# as.mo("S aureus") 14 15 31 25 43 82 10 +# as.mo("Staphylococcus aureus") 11 11 17 12 14 42 10 +# as.mo("Staphylococcus aureus (MRSA)") 920 940 960 950 970 1100 10 +# as.mo("Sthafilokkockus aaureuz") 420 440 460 460 460 500 10 +# as.mo("MRSA") 13 14 20 14 16 43 10 +# as.mo("VISA") 15 15 28 27 40 42 10 +# as.mo("VRSA") 13 15 18 15 17 45 10 +# as.mo(22242419) 130 140 150 150 170 180 10

    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 100 milliseconds, this is only 10 input values per second.

    To achieve this speed, the as.mo function also takes into account the prevalence of human pathogenic microorganisms. The downside of this is of course that less prevalent microorganisms will be determined less fast. See this example for the ID of Methanosarcina semesiae (B_MTHNSR_SEMS), a bug probably never found before in humans:

    @@ -247,12 +247,12 @@ times = 10) print(M.semesiae, unit = "ms", signif = 4) # Unit: milliseconds -# expr min lq mean median uq max -# as.mo("metsem") 169.600 189.900 199.30 199.70 211.00 223.90 -# as.mo("METSEM") 170.000 186.900 197.40 191.80 210.70 232.30 -# as.mo("M. semesiae") 11.330 11.620 12.37 12.21 13.20 13.78 -# as.mo("M. semesiae") 11.410 12.090 15.74 12.48 13.55 43.19 -# as.mo("Methanosarcina semesiae") 8.592 8.906 12.89 9.31 11.54 41.08 +# expr min lq mean median uq max +# as.mo("metsem") 180.20 190.40 199.00 199.10 204.40 218.80 +# as.mo("METSEM") 190.00 191.50 203.30 193.70 221.00 236.30 +# as.mo("M. semesiae") 11.60 12.58 15.84 13.42 14.40 37.45 +# as.mo("M. semesiae") 12.14 12.59 19.44 14.19 14.78 43.90 +# as.mo("Methanosarcina semesiae") 10.65 10.78 16.81 12.13 14.08 37.01 # neval # 10 # 10 @@ -292,8 +292,8 @@ print(run_it, unit = "ms", signif = 3) # Unit: milliseconds # expr min lq mean median uq max neval -# mo_name(x) 1610 1650 1680 1670 1710 1780 10 -

    So transforming 500,000 values (!!) of 50 unique values only takes 1.67 seconds. You only lose time on your unique input values.

    +# mo_name(x) 1840 1850 1910 1900 1950 2020 10 +

    So transforming 500,000 values (!!) of 50 unique values only takes 1.9 seconds. You only lose time on your unique input values.

    @@ -306,10 +306,10 @@ print(run_it, unit = "ms", signif = 3) # Unit: milliseconds # expr min lq mean median uq max neval -# A 8.15 8.69 9.63 9.05 10.40 12.40 10 -# B 11.30 12.70 17.50 13.40 14.80 54.30 10 -# C 1.04 1.17 1.28 1.28 1.38 1.59 10

    -

    So going from mo_name("Staphylococcus aureus") to "Staphylococcus aureus" takes 0.0013 seconds - it doesn’t even start calculating if the result would be the same as the expected resulting value. That goes for all helper functions:

    +# A 8.08 8.52 8.94 8.57 9.49 10.50 10 +# B 10.40 10.70 14.60 11.00 11.70 45.70 10 +# C 1.04 1.10 1.19 1.15 1.29 1.46 10 +

    So going from mo_name("Staphylococcus aureus") to "Staphylococcus aureus" takes 0.0012 seconds - it doesn’t even start calculating if the result would be the same as the expected resulting value. That goes for all helper functions:

    run_it <- microbenchmark(A = mo_species("aureus"),
                              B = mo_genus("Staphylococcus"),
                              C = mo_name("Staphylococcus aureus"),
    @@ -321,15 +321,15 @@
                              times = 10)
     print(run_it, unit = "ms", signif = 3)
     # Unit: milliseconds
    -#  expr   min    lq  mean median    uq  max neval
    -#     A 0.852 0.977 1.040  0.990 1.040 1.29    10
    -#     B 0.802 0.933 1.070  0.994 1.160 1.65    10
    -#     C 0.804 0.983 1.060  1.000 1.210 1.32    10
    -#     D 0.783 0.855 0.996  0.989 1.030 1.36    10
    -#     E 0.820 0.962 1.020  0.982 1.070 1.27    10
    -#     F 0.770 0.785 0.937  0.953 0.996 1.30    10
    -#     G 0.963 0.981 1.140  1.160 1.250 1.38    10
    -#     H 0.778 0.842 0.985  0.977 0.995 1.30    10
    +# expr min lq mean median uq max neval +# A 0.862 1.030 1.070 1.060 1.08 1.33 10 +# B 0.837 1.020 1.010 1.030 1.05 1.13 10 +# C 0.836 0.936 0.993 1.020 1.03 1.17 10 +# D 0.838 0.947 1.030 1.050 1.10 1.31 10 +# E 0.807 0.906 0.994 1.010 1.03 1.28 10 +# F 0.804 0.920 1.060 1.040 1.11 1.54 10 +# G 0.805 0.906 1.000 1.030 1.07 1.25 10 +# H 0.792 0.805 0.949 0.941 1.04 1.29 10

    Of course, when running mo_phylum("Firmicutes") the function has zero knowledge about the actual microorganism, namely S. aureus. But since the result would be "Firmicutes" anyway, there is no point in calculating the result. And because this package ‘knows’ all phyla of all known bacteria (according to the Catalogue of Life), it can just return the initial value immediately.

    @@ -356,13 +356,13 @@ print(run_it, unit = "ms", signif = 4) # Unit: milliseconds # expr min lq mean median uq max neval -# en 12.84 13.10 18.11 14.63 15.54 58.10 100 -# de 13.58 14.02 18.05 14.61 16.58 69.21 100 -# nl 17.07 17.89 22.36 18.97 20.85 68.70 100 -# es 13.63 14.20 20.75 15.82 16.79 73.94 100 -# it 13.64 13.95 16.95 15.40 16.57 50.96 100 -# fr 13.74 14.12 19.84 15.81 16.62 61.13 100 -# pt 13.58 14.02 19.00 14.90 16.49 53.41 100
    +# en 12.09 12.45 16.18 12.63 13.57 48.69 100 +# de 13.01 13.51 16.67 13.82 15.26 48.22 100 +# nl 16.88 17.25 19.13 17.54 18.36 51.99 100 +# es 13.13 13.42 18.26 13.69 14.59 53.66 100 +# it 13.01 13.35 17.33 13.71 15.16 50.65 100 +# fr 13.13 13.40 16.31 13.64 13.88 49.44 100 +# pt 13.17 13.38 15.10 13.54 13.94 49.61 100

    Currently supported are German, Dutch, Spanish, Italian, French and Portuguese.

    diff --git a/docs/articles/benchmarks_files/figure-html/unnamed-chunk-4-1.png b/docs/articles/benchmarks_files/figure-html/unnamed-chunk-4-1.png index 6de48d86..bcfa992f 100644 Binary files a/docs/articles/benchmarks_files/figure-html/unnamed-chunk-4-1.png and b/docs/articles/benchmarks_files/figure-html/unnamed-chunk-4-1.png differ diff --git a/docs/articles/benchmarks_files/figure-html/unnamed-chunk-6-1.png b/docs/articles/benchmarks_files/figure-html/unnamed-chunk-6-1.png index 6e1e8e3b..60942120 100644 Binary files a/docs/articles/benchmarks_files/figure-html/unnamed-chunk-6-1.png and b/docs/articles/benchmarks_files/figure-html/unnamed-chunk-6-1.png differ diff --git a/docs/articles/index.html b/docs/articles/index.html index 2f51316a..fe0e37a4 100644 --- a/docs/articles/index.html +++ b/docs/articles/index.html @@ -81,7 +81,7 @@ AMR (for R) - 1.2.0.9036 + 1.2.0.9037 @@ -176,7 +176,7 @@
  • - + Manual @@ -190,7 +190,7 @@
  • - + Changelog @@ -206,10 +206,10 @@
  • - - + + - Licence + Survey
  • diff --git a/docs/articles/resistance_predict.html b/docs/articles/resistance_predict.html index 2e55e6d2..13eb883a 100644 --- a/docs/articles/resistance_predict.html +++ b/docs/articles/resistance_predict.html @@ -39,7 +39,7 @@ AMR (for R) - 1.2.0.9030 + 1.2.0.9037 @@ -134,7 +134,7 @@
  • - + Manual @@ -148,7 +148,7 @@
  • - + Changelog @@ -164,10 +164,10 @@
  • - - + + - Licence + Survey
  • @@ -186,7 +186,7 @@

    How to predict antimicrobial resistance

    Matthijs S. Berends

    -

    09 July 2020

    +

    24 July 2020

    Source: vignettes/resistance_predict.Rmd diff --git a/docs/authors.html b/docs/authors.html index aedf53ce..13b2454b 100644 --- a/docs/authors.html +++ b/docs/authors.html @@ -81,7 +81,7 @@ AMR (for R) - 1.2.0.9036 + 1.2.0.9037 @@ -176,7 +176,7 @@
  • - + Manual @@ -190,7 +190,7 @@
  • - + Changelog @@ -206,10 +206,10 @@
  • - - + + - Licence + Survey
  • diff --git a/docs/countries.png b/docs/countries.png index 31fc19e1..a6e82d12 100644 Binary files a/docs/countries.png and b/docs/countries.png differ diff --git a/docs/countries_large.png b/docs/countries_large.png index 262b394b..0a5cd21f 100644 Binary files a/docs/countries_large.png and b/docs/countries_large.png differ diff --git a/docs/extra.css b/docs/extra.css index 5886f420..5cc5b30c 100644 --- a/docs/extra.css +++ b/docs/extra.css @@ -117,11 +117,17 @@ li, p { li p { margin-top: 10.5px; } +.template-news li p { + margin: 0; +} /* slightly smaller blockquote */ blockquote { font-size: 98%; } +.template-home blockquote { + border: 5px solid #128f7645 !important; +} /* 2nd list in navigation should be smaller */ #tocnav li li { diff --git a/docs/index.html b/docs/index.html index 054370d5..eebf5a7d 100644 --- a/docs/index.html +++ b/docs/index.html @@ -43,7 +43,7 @@ AMR (for R) - 1.2.0.9036 + 1.2.0.9037 @@ -138,7 +138,7 @@
  • - + Manual @@ -152,7 +152,7 @@
  • - + Changelog @@ -168,10 +168,10 @@
  • - - + + - Licence + Survey
  • @@ -191,8 +191,8 @@ AMR (for R)
    -

    METHODS PAPER PREPRINTED
    -A methods paper about this package has been preprinted at bioRxiv (DOI: 10.1101/810622). Please click here for the paper on bioRxiv’s publishers page.

    +

    July 2020
    PLEASE TAKE PART IN OUR SURVEY!
    +Since you are one of our users, we would like to know how you use the package and what it brought you or your organisation. If you have a minute, please anonymously fill in this short questionnaire. Your valuable input will help to improve the package and its functionalities. You can answer the open questions in either English, Spanish, French, Dutch, or German. Thank you very much in advance!

    @@ -200,10 +200,10 @@ A methods paper about this package has been preprinted at bioRxiv (DOI: 10.1101/

    (To find out how to conduct AMR analysis, please continue reading here to get started.)

    AMR is a free, open-source and independent R package 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. Our aim is to provide a standard for clean and reproducible antimicrobial resistance data analysis, that can therefore empower epidemiological analyses to continuously enable surveillance and treatment evaluation in any setting.

    After installing this package, R knows ~70,000 distinct microbial species and all ~550 antibiotic, antimycotic and antiviral drugs by name and code (including ATC, EARS-NET, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data.

    -

    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.0 (April 2013). It was designed to work in any setting, including those with very limited resources. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the University of Groningen, in collaboration with non-profit organisations Certe Medical Diagnostics and Advice and University Medical Center Groningen. This R package is actively maintained and is free software (see Copyright).

    +

    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.0 (April 2013). It was designed to work in any setting, including those with very limited resources. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the University of Groningen, in collaboration with non-profit organisations Certe Medical Diagnostics and Advice and University Medical Center Groningen. This R package is actively maintained and is free software (see Copyright).

    - Used in more than 100 countries
    Since its first public release in early 2018, this package has been downloaded from more than 100 countries (source: CRAN logs). Click the map to enlarge, to see the names of the countries. + Used in more than 100 countries
    Since its first public release in early 2018, this package has been downloaded from more than 100 countries. Click the map to enlarge and to also see the names of the countries.



    diff --git a/docs/news/index.html b/docs/news/index.html index 98ea0b59..ac78bfec 100644 --- a/docs/news/index.html +++ b/docs/news/index.html @@ -81,7 +81,7 @@ AMR (for R) - 1.2.0.9036 + 1.2.0.9037

    @@ -176,7 +176,7 @@
  • - + Manual @@ -190,7 +190,7 @@
  • - + Changelog @@ -206,10 +206,10 @@
  • - - + + - Licence + Survey
  • @@ -229,13 +229,13 @@ Source: NEWS.md -
    -

    -AMR 1.2.0.9036 Unreleased +
    +

    +AMR 1.2.0.9037 Unreleased

    -
    +

    -Last updated: 22 July 2020 +Last updated: 28 July 2020

    @@ -243,7 +243,7 @@
    • Function ab_from_text() to retrieve antimicrobial drug names, doses and forms of administration from clinical texts in e.g. health care records, which also corrects for misspelling since it uses as.ab() internally

    • -

      Tidyverse selections for antibiotic classes, that help to select the columns of antibiotics that are of a specific antibiotic class, without the need to define the columns or antibiotic abbreviations. They can be used in any function that allows Tidyverse selections, like dplyr::select() and tidyr::pivot_longer():

      +

      Tidyverse selection helpers for antibiotic classes, that help to select the columns of antibiotics that are of a specific antibiotic class, without the need to define the columns or antibiotic abbreviations. They can be used in any function that allows selection helpers, like dplyr::select() and tidyr::pivot_longer():

      library(dplyr)
       
       # Columns 'IPM' and 'MEM' are in the example_isolates data set
      @@ -285,13 +285,21 @@
       
    • Fixed a bug where eucast_rules() would not work on a tibble when the tibble or dplyr package was loaded

    • All *_join_microorganisms() functions and bug_drug_combinations() now return the original data class (e.g. tibbles and data.tables)

    • -
    • Fixed a bug for using grouped versions of rsi_df(), proportion_df() and count_df(), and fixed a bug where not all different antimicrobial results were added as rows

    • +
    • +

      For functions rsi_df(), proportion_df() and count_df():

      +
        +
      • Fixed a bug for using grouped versions
      • +
      • Fixed a bug where not all different antimicrobial results were added as rows
      • +
      • Fixed a bug when only calculating counts (count_df()) when all antibiotics in the data set have only NAs
      • +
      +
    • Improved auto-determination for columns of types <mo> and <Date>

    • Fixed a bug in bug_drug_combinations() for when only one antibiotic was in the input data

    • Changed the summary for class <rsi>, to highlight the %SI vs. %R

    • Improved error handling, giving more useful info when functions return an error

    • Any progress bar will now only show in interactive mode (i.e. not in R Markdown)

    • Speed improvement for mdro() and filter_ab_class()

    • +
    • New option arrows_textangled for ggplot_pca() to indicate whether the text at the end of the arrows should be angled (defaults to TRUE, as it was in previous versions)

    diff --git a/docs/pkgdown.yml b/docs/pkgdown.yml index 4433c514..5289c789 100644 --- a/docs/pkgdown.yml +++ b/docs/pkgdown.yml @@ -10,7 +10,7 @@ articles: WHONET: WHONET.html benchmarks: benchmarks.html resistance_predict: resistance_predict.html -last_built: 2020-07-22T10:28Z +last_built: 2020-07-28T16:39Z urls: reference: https://msberends.github.io/AMR/reference article: https://msberends.github.io/AMR/articles diff --git a/docs/reference/AMR-deprecated.html b/docs/reference/AMR-deprecated.html index e46ed965..48570684 100644 --- a/docs/reference/AMR-deprecated.html +++ b/docs/reference/AMR-deprecated.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037
    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -258,7 +258,7 @@ The lifecycle of this function is retiredOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -239,10 +239,11 @@

    Details

    -

    AMR is a free and open-source R package to simplify the analysis and prediction of Antimicrobial Resistance (AMR) and to work with microbial and antimicrobial properties by using evidence-based methods. It supports any table format, including WHONET/EARS-Net data.

    -

    We created this package for both academic research and routine analysis at the Faculty of Medical Sciences of the University of Groningen and the Medical Microbiology & Infection Prevention (MMBI) department of the University Medical Center Groningen (UMCG). This R package is actively maintained and free software; you can freely use and distribute it for both personal and commercial (but not patent) purposes under the terms of the GNU General Public License version 2.0 (GPL-2), as published by the Free Software Foundation.

    +

    AMR is a free, open-source and independent R package 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. Our aim is to provide a standard for clean and reproducible antimicrobial resistance data analysis, that can therefore empower epidemiological analyses to continuously enable surveillance and treatment evaluation in any setting.

    +

    After installing this package, R knows ~70,000 distinct microbial species and all ~550 antibiotic, antimycotic and antiviral drugs by name and code (including ATC, EARS-NET, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data.

    +

    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.0 (April 2013). It was designed to work in any setting, including those with very limited resources. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the University of Groningen, in collaboration with non-profit organisations Certe Medical Diagnostics and Advice and University Medical Center Groningen. This R package is actively maintained and free software; you can freely use and distribute it for both personal and commercial (but not patent) purposes under the terms of the GNU General Public License version 2.0 (GPL-2), as published by the Free Software Foundation.

    This package can be used for:

      -
    • Reference for the taxonomy of microorganisms, since the package contains all microbial (sub)species from the Catalogue of Life

    • +
    • Reference for the taxonomy of microorganisms, since the package contains all microbial (sub)species from the Catalogue of Life and List of Prokaryotic names with Standing in Nomenclature

    • Interpreting raw MIC and disk diffusion values, based on the latest CLSI or EUCAST guidelines

    • Retrieving antimicrobial drug names, doses and forms of administration from clinical health care records

    • Determining first isolates to be used for AMR analysis

    • @@ -251,10 +252,11 @@
    • Calculating (empirical) susceptibility of both mono therapy and combination therapies

    • Predicting future antimicrobial resistance using regression models

    • Getting properties for any microorganism (like Gram stain, species, genus or family)

    • -
    • Getting properties for any antibiotic (like name, EARS-Net code, ATC code, PubChem code, defined daily dose or trade name)

    • +
    • Getting properties for any antibiotic (like name, code of EARS-Net/ATC/LOINC/PubChem, defined daily dose or trade name)

    • Plotting antimicrobial resistance

    • -
    • Getting SNOMED codes of a microorganism, or get its name associated with a SNOMED code

    • -
    • Getting LOINC codes of an antibiotic, or get its name associated with a LOINC code

    • +
    • Applying EUCAST expert rules

    • +
    • Getting SNOMED codes of a microorganism, or getting properties of a microorganism based on a SNOMED code

    • +
    • Getting LOINC codes of an antibiotic, or getting properties of an antibiotic based on a LOINC code

    • Machine reading the EUCAST and CLSI guidelines from 2011-2020 to translate MIC values and disk diffusion diameters to R/SI

    • Principal component analysis for AMR

    @@ -263,7 +265,7 @@ -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Contact Us

    diff --git a/docs/reference/WHOCC.html b/docs/reference/WHOCC.html index 753da0cf..03d6157a 100644 --- a/docs/reference/WHOCC.html +++ b/docs/reference/WHOCC.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037
    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -250,7 +250,7 @@ This package contains all ~550 antibiotic, antimycotic and antiviral dru -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    as.ab("meropenem")
    diff --git a/docs/reference/WHONET.html b/docs/reference/WHONET.html
    index 440a6267..13cae858 100644
    --- a/docs/reference/WHONET.html
    +++ b/docs/reference/WHONET.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9032
    +        1.2.0.9037
           
         
    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -273,7 +273,7 @@ -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -304,7 +304,7 @@ The lifecycle of this function is maturing< -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    # mind the bad spelling of amoxicillin in this line, 
    diff --git a/docs/reference/ab_property.html b/docs/reference/ab_property.html
    index d4148b1d..7802e6e1 100644
    --- a/docs/reference/ab_property.html
    +++ b/docs/reference/ab_property.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9032
    +        1.2.0.9037
           
         
     
    @@ -177,7 +177,7 @@
       
     
     
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -330,7 +330,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/age.html b/docs/reference/age.html index 7088155a..3d86c234 100644 --- a/docs/reference/age.html +++ b/docs/reference/age.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -272,7 +272,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    To split ages into groups, use the age_groups() function.

    diff --git a/docs/reference/age_groups.html b/docs/reference/age_groups.html index 83e7a05d..56a215f9 100644 --- a/docs/reference/age_groups.html +++ b/docs/reference/age_groups.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -281,7 +281,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    To determine ages, based on one or more reference dates, use the age() function.

    diff --git a/docs/reference/antibiotic_class_selectors.html b/docs/reference/antibiotic_class_selectors.html index 0a843f42..2d5e7ac4 100644 --- a/docs/reference/antibiotic_class_selectors.html +++ b/docs/reference/antibiotic_class_selectors.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9030 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • diff --git a/docs/reference/antibiotics.html b/docs/reference/antibiotics.html index bf1444f0..90f739e2 100644 --- a/docs/reference/antibiotics.html +++ b/docs/reference/antibiotics.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -314,7 +314,7 @@ This package contains all ~550 antibiotic, antimycotic and antiviral dru -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/as.ab.html b/docs/reference/as.ab.html index 19e95438..5d8f9e8d 100644 --- a/docs/reference/as.ab.html +++ b/docs/reference/as.ab.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -296,7 +296,7 @@ This package contains all ~550 antibiotic, antimycotic and antiviral dru -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/as.disk.html b/docs/reference/as.disk.html index 41bd4c88..0b3e14fd 100644 --- a/docs/reference/as.disk.html +++ b/docs/reference/as.disk.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037
    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -269,7 +269,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/as.mic.html b/docs/reference/as.mic.html index 7ccfe916..b30dd667 100644 --- a/docs/reference/as.mic.html +++ b/docs/reference/as.mic.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -269,7 +269,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/as.mo.html b/docs/reference/as.mo.html index 9584cf37..a7ae22dd 100644 --- a/docs/reference/as.mo.html +++ b/docs/reference/as.mo.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9035 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -378,7 +378,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    microorganisms for the data.frame that is being used to determine ID's.

    diff --git a/docs/reference/as.rsi.html b/docs/reference/as.rsi.html index e8909e13..723ec9e3 100644 --- a/docs/reference/as.rsi.html +++ b/docs/reference/as.rsi.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037
    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -308,7 +308,7 @@

    When using as.rsi() on untransformed data, the data will be cleaned to only contain values S, I and R. When using the function on data with class mic (using as.mic()) or class disk (using as.disk()), the data will be interpreted based on the guideline set with the guideline parameter.

    Supported guidelines to be used as input for the guideline parameter are: "CLSI 2010", "CLSI 2011", "CLSI 2012", "CLSI 2013", "CLSI 2014", "CLSI 2015", "CLSI 2016", "CLSI 2017", "CLSI 2018", "CLSI 2019", "EUCAST 2011", "EUCAST 2012", "EUCAST 2013", "EUCAST 2014", "EUCAST 2015", "EUCAST 2016", "EUCAST 2017", "EUCAST 2018", "EUCAST 2019", "EUCAST 2020". Simply using "CLSI" or "EUCAST" for input will automatically select the latest version of that guideline.

    -

    The repository of this package contains a machine readable version of all guidelines. This is a CSV file consisting of 18,964 rows and 10 columns. This file is machine readable, since it contains one row for every unique combination of the test method (MIC or disk diffusion), the antimicrobial agent and the microorganism. This allows for easy implementation of these rules in laboratory information systems (LIS).

    +

    The repository of this package contains a machine readable version of all guidelines. This is a CSV file consisting of 18,964 rows and 10 columns. This file is machine readable, since it contains one row for every unique combination of the test method (MIC or disk diffusion), the antimicrobial agent and the microorganism. This allows for easy implementation of these rules in laboratory information systems (LIS).

    After using as.rsi(), you can use eucast_rules() to (1) apply inferred susceptibility and resistance based on results of other antimicrobials and (2) apply intrinsic resistance based on taxonomic properties of a microorganism.

    The function is.rsi.eligible() returns TRUE when a columns contains at most 5% invalid antimicrobial interpretations (not S and/or I and/or R), and FALSE otherwise. The threshold of 5% can be set with the threshold parameter.

    Interpretation of R and S/I

    @@ -336,7 +336,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/atc_online.html b/docs/reference/atc_online.html index 31944846..72454c0f 100644 --- a/docs/reference/atc_online.html +++ b/docs/reference/atc_online.html @@ -83,7 +83,7 @@ This function requires an internet connection." /> AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -178,7 +178,7 @@ This function requires an internet connection." />
  • - + Manual @@ -192,7 +192,7 @@ This function requires an internet connection." />
  • - + Changelog @@ -208,10 +208,10 @@ This function requires an internet connection." />
  • - - + + - Licence + Survey
  • @@ -312,7 +312,7 @@ The lifecycle of this function is questioni -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    if (FALSE) {
    diff --git a/docs/reference/availability.html b/docs/reference/availability.html
    index 3ec059c8..cac14df6 100644
    --- a/docs/reference/availability.html
    +++ b/docs/reference/availability.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9032
    +        1.2.0.9037
           
         
     
    @@ -177,7 +177,7 @@
       
     
     
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -267,7 +267,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    availability(example_isolates)
    diff --git a/docs/reference/bug_drug_combinations.html b/docs/reference/bug_drug_combinations.html
    index 6bafa339..89017536 100644
    --- a/docs/reference/bug_drug_combinations.html
    +++ b/docs/reference/bug_drug_combinations.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9032
    +        1.2.0.9037
           
         
     
    @@ -177,7 +177,7 @@
       
     
     
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -333,7 +333,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    # \donttest{
    diff --git a/docs/reference/catalogue_of_life.html b/docs/reference/catalogue_of_life.html
    index b2ba47b0..c4341cb9 100644
    --- a/docs/reference/catalogue_of_life.html
    +++ b/docs/reference/catalogue_of_life.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9032
    +        1.2.0.9037
           
         
     
    @@ -177,7 +177,7 @@
       
     
     
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -263,7 +263,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    Data set microorganisms for the actual data.
    diff --git a/docs/reference/catalogue_of_life_version.html b/docs/reference/catalogue_of_life_version.html index 9ee14870..196581cc 100644 --- a/docs/reference/catalogue_of_life_version.html +++ b/docs/reference/catalogue_of_life_version.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037

    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -255,7 +255,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/count.html b/docs/reference/count.html index 6b8d553a..56f587e5 100644 --- a/docs/reference/count.html +++ b/docs/reference/count.html @@ -83,7 +83,7 @@ count_resistant() should be used to count resistant isolates, count_susceptible( AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -178,7 +178,7 @@ count_resistant() should be used to count resistant isolates, count_susceptible(
  • - + Manual @@ -192,7 +192,7 @@ count_resistant() should be used to count resistant isolates, count_susceptible(
  • - + Changelog @@ -208,10 +208,10 @@ count_resistant() should be used to count resistant isolates, count_susceptible(
  • - - + + - Licence + Survey
  • @@ -360,7 +360,7 @@ A microorganism is categorised as Susceptible, Increased exposure when -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    proportion_* to calculate microbial resistance and susceptibility.

    diff --git a/docs/reference/eucast_rules.html b/docs/reference/eucast_rules.html index 901e70ae..96a91b90 100644 --- a/docs/reference/eucast_rules.html +++ b/docs/reference/eucast_rules.html @@ -83,7 +83,7 @@ To improve the interpretation of the antibiogram before EUCAST rules are applied AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -178,7 +178,7 @@ To improve the interpretation of the antibiogram before EUCAST rules are applied
  • - + Manual @@ -192,7 +192,7 @@ To improve the interpretation of the antibiogram before EUCAST rules are applied
  • - + Changelog @@ -208,10 +208,10 @@ To improve the interpretation of the antibiogram before EUCAST rules are applied
  • - - + + - Licence + Survey
  • @@ -403,7 +403,7 @@ The lifecycle of this function is maturing< -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    # \donttest{
    diff --git a/docs/reference/example_isolates.html b/docs/reference/example_isolates.html
    index f954b10d..d58911bf 100644
    --- a/docs/reference/example_isolates.html
    +++ b/docs/reference/example_isolates.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9032
    +        1.2.0.9037
           
         
     
    @@ -177,7 +177,7 @@
       
     
     
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -257,7 +257,7 @@ -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -252,7 +252,7 @@ -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -303,8 +303,7 @@ The lifecycle of this function is stable

    antibiotic_class_selectors() for the select() equivalent.

    Examples

    -
    if (FALSE) {
    -library(dplyr)
    +    
    if (require(dplyr)) {
     
     # filter on isolates that have any result for any aminoglycoside
     example_isolates %>% filter_ab_class("aminoglycoside")
    @@ -333,6 +332,12 @@ The lifecycle of this function is stableexample_isolates %>%
       filter_aminoglycosides("R", "all") %>%
       filter_fluoroquinolones("R", "all")
    +}
    +
    +if (FALSE) {
    +# with dplyr 1.0.0 and higher (that adds 'across()'), this is equal:
    +example_isolates %>% filter_carbapenems("R", "all")
    +example_isolates %>% filter(across(carbapenems(), ~. == "R"))
     }
    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -393,7 +393,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/g.test.html b/docs/reference/g.test.html index 5dd3fcec..d6257521 100644 --- a/docs/reference/g.test.html +++ b/docs/reference/g.test.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -334,7 +334,7 @@ The lifecycle of this function is questioni -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    References

    diff --git a/docs/reference/ggplot_pca.html b/docs/reference/ggplot_pca.html index 8789aae8..fb501b22 100644 --- a/docs/reference/ggplot_pca.html +++ b/docs/reference/ggplot_pca.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -254,6 +254,7 @@ arrows_colour = "darkblue", arrows_size = 0.5, arrows_textsize = 3, + arrows_textangled = TRUE, arrows_alpha = 0.75, base_textsize = 10, ... @@ -343,6 +344,10 @@ arrows_textsize

    the size of the text at the end of the arrows

    + + arrows_textangled +

    a logical whether the text at the end of the arrows should be angled

    + arrows_alpha

    the alpha (transparency) of the arrows and their text

    @@ -370,7 +375,7 @@

    Details

    -

    The colours for labels and points can be changed by adding another scale layer for colour, like scale_colour_viridis_d() or scale_colour_brewer().

    +

    The colours for labels and points can be changed by adding another scale layer for colour, like scale_colour_viridis_d() or scale_colour_brewer().

    Maturing lifecycle

    @@ -382,20 +387,25 @@ The lifecycle of this function is maturing<
    # `example_isolates` is a dataset available in the AMR package.
     # See ?example_isolates.
     
    -if (FALSE) {
     # See ?pca for more info about Principal Component Analysis (PCA).
    -library(dplyr)
    -pca_model <- example_isolates %>%
    -  filter(mo_genus(mo) == "Staphylococcus") %>%
    -  group_by(species = mo_shortname(mo)) %>%
    -  summarise_if (is.rsi, resistance) %>%
    -  pca(FLC, AMC, CXM, GEN, TOB, TMP, SXT, CIP, TEC, TCY, ERY)
    +if (require("dplyr")) {
    +  pca_model <- example_isolates %>%
    +    filter(mo_genus(mo) == "Staphylococcus") %>%
    +    group_by(species = mo_shortname(mo)) %>%
    +    summarise_if (is.rsi, resistance) %>%
    +    pca(FLC, AMC, CXM, GEN, TOB, TMP, SXT, CIP, TEC, TCY, ERY)
     
    -# old
    -biplot(pca_model)
    +  # old (base R)
    +  biplot(pca_model)
     
    -# new 
    -ggplot_pca(pca_model)
    +  # new 
    +  ggplot_pca(pca_model)
    +
    +  if (require("ggplot2")) {
    +    ggplot_pca(pca_model) +
    +      scale_colour_viridis_d() +
    +      labs(title = "Title here")
    +  }
     }
    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -409,7 +409,7 @@ The lifecycle of this function is maturing< -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    if (require("ggplot2") & require("dplyr")) {
    diff --git a/docs/reference/guess_ab_col.html b/docs/reference/guess_ab_col.html
    index 3ea6ae7f..044223d3 100644
    --- a/docs/reference/guess_ab_col.html
    +++ b/docs/reference/guess_ab_col.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9035
    +        1.2.0.9037
           
         
     
    @@ -177,7 +177,7 @@
       
     
     
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -270,7 +270,7 @@ The lifecycle of this function is maturing< -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    df <- data.frame(amox = "S",
    diff --git a/docs/reference/index.html b/docs/reference/index.html
    index a9db2718..ec02c3d5 100644
    --- a/docs/reference/index.html
    +++ b/docs/reference/index.html
    @@ -81,7 +81,7 @@
           
           
             AMR (for R)
    -        1.2.0.9036
    +        1.2.0.9037
           
         
     
    @@ -176,7 +176,7 @@
       
     
     
  • - + Manual @@ -190,7 +190,7 @@
  • - + Changelog @@ -206,10 +206,10 @@
  • - - + + - Licence + Survey
  • diff --git a/docs/reference/join.html b/docs/reference/join.html index b87b284d..eadf129e 100644 --- a/docs/reference/join.html +++ b/docs/reference/join.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -283,7 +283,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    left_join_microorganisms(as.mo("K. pneumoniae"))
    diff --git a/docs/reference/key_antibiotics.html b/docs/reference/key_antibiotics.html
    index bfc73187..1fdb818e 100644
    --- a/docs/reference/key_antibiotics.html
    +++ b/docs/reference/key_antibiotics.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9032
    +        1.2.0.9037
           
         
     
    @@ -177,7 +177,7 @@
       
     
     
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -379,7 +379,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/kurtosis.html b/docs/reference/kurtosis.html index b89a5ada..bdabbd5b 100644 --- a/docs/reference/kurtosis.html +++ b/docs/reference/kurtosis.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -269,7 +269,7 @@ The lifecycle of this function is questioni -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/lifecycle.html b/docs/reference/lifecycle.html index 60764f16..420ff8b9 100644 --- a/docs/reference/lifecycle.html +++ b/docs/reference/lifecycle.html @@ -84,7 +84,7 @@ This page contains a section for every lifecycle (with text borrowed from the af AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -179,7 +179,7 @@ This page contains a section for every lifecycle (with text borrowed from the af
  • - + Manual @@ -193,7 +193,7 @@ This page contains a section for every lifecycle (with text borrowed from the af
  • - + Changelog @@ -209,10 +209,10 @@ This page contains a section for every lifecycle (with text borrowed from the af
  • - - + + - Licence + Survey
  • diff --git a/docs/reference/like.html b/docs/reference/like.html index 8d0326b1..06129cfc 100644 --- a/docs/reference/like.html +++ b/docs/reference/like.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -285,7 +285,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/mdro.html b/docs/reference/mdro.html index e5fafdf1..bdc21489 100644 --- a/docs/reference/mdro.html +++ b/docs/reference/mdro.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -437,7 +437,7 @@ A microorganism is categorised as Susceptible, Increased exposure when -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    if (FALSE) {
    diff --git a/docs/reference/microorganisms.codes.html b/docs/reference/microorganisms.codes.html
    index 810ecda3..f139dca1 100644
    --- a/docs/reference/microorganisms.codes.html
    +++ b/docs/reference/microorganisms.codes.html
    @@ -82,7 +82,7 @@
           
           
             AMR (for R)
    -        1.2.0.9032
    +        1.2.0.9037
           
         
     
    @@ -177,7 +177,7 @@
       
     
     
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -256,7 +256,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/microorganisms.html b/docs/reference/microorganisms.html index 2ff8e2da..726a0415 100644 --- a/docs/reference/microorganisms.html +++ b/docs/reference/microorganisms.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9035 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -299,7 +299,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/microorganisms.old.html b/docs/reference/microorganisms.old.html index d699f0f3..c13fa5f0 100644 --- a/docs/reference/microorganisms.old.html +++ b/docs/reference/microorganisms.old.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -262,7 +262,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/mo_property.html b/docs/reference/mo_property.html index 1c350fa8..1491ffeb 100644 --- a/docs/reference/mo_property.html +++ b/docs/reference/mo_property.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -361,7 +361,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/mo_source.html b/docs/reference/mo_source.html index b234b67b..ca72e5ef 100644 --- a/docs/reference/mo_source.html +++ b/docs/reference/mo_source.html @@ -83,7 +83,7 @@ This is the fastest way to have your organisation (or analysis) specific codes p AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -178,7 +178,7 @@ This is the fastest way to have your organisation (or analysis) specific codes p
  • - + Manual @@ -192,7 +192,7 @@ This is the fastest way to have your organisation (or analysis) specific codes p
  • - + Changelog @@ -208,10 +208,10 @@ This is the fastest way to have your organisation (or analysis) specific codes p
  • - - + + - Licence + Survey
  • @@ -316,7 +316,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -263,7 +263,7 @@ The lifecycle of this function is questioni -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • diff --git a/docs/reference/proportion.html b/docs/reference/proportion.html index e0aed1d2..dd6cdd80 100644 --- a/docs/reference/proportion.html +++ b/docs/reference/proportion.html @@ -83,7 +83,7 @@ resistance() should be used to calculate resistance, susceptibility() should be AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -178,7 +178,7 @@ resistance() should be used to calculate resistance, susceptibility() should be
  • - + Manual @@ -192,7 +192,7 @@ resistance() should be used to calculate resistance, susceptibility() should be
  • - + Changelog @@ -208,10 +208,10 @@ resistance() should be used to calculate resistance, susceptibility() should be
  • - - + + - Licence + Survey
  • @@ -379,7 +379,7 @@ A microorganism is categorised as Susceptible, Increased exposure when -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    count() to count resistant and susceptible isolates.

    diff --git a/docs/reference/resistance_predict.html b/docs/reference/resistance_predict.html index 7a267a91..3cdb7e03 100644 --- a/docs/reference/resistance_predict.html +++ b/docs/reference/resistance_predict.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -381,7 +381,7 @@ A microorganism is categorised as Susceptible, Increased exposure when -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    The proportion() functions to calculate resistance

    diff --git a/docs/reference/rsi_translation.html b/docs/reference/rsi_translation.html index eafa4c81..0ad2b349 100644 --- a/docs/reference/rsi_translation.html +++ b/docs/reference/rsi_translation.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9035 + 1.2.0.9037
    @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -260,7 +260,7 @@ -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    @@ -178,7 +178,7 @@ When negative: the left tail is longer; the mass of the distribution is concentr
  • - + Manual @@ -192,7 +192,7 @@ When negative: the left tail is longer; the mass of the distribution is concentr
  • - + Changelog @@ -208,10 +208,10 @@ When negative: the left tail is longer; the mass of the distribution is concentr
  • - - + + - Licence + Survey
  • @@ -271,7 +271,7 @@ The lifecycle of this function is questioni -

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    See also

    diff --git a/docs/reference/translate.html b/docs/reference/translate.html index 0c8650b9..10552d28 100644 --- a/docs/reference/translate.html +++ b/docs/reference/translate.html @@ -82,7 +82,7 @@ AMR (for R) - 1.2.0.9032 + 1.2.0.9037 @@ -177,7 +177,7 @@
  • - + Manual @@ -191,7 +191,7 @@
  • - + Changelog @@ -207,10 +207,10 @@
  • - - + + - Licence + Survey
  • @@ -256,7 +256,7 @@ The lifecycle of this function is stableOn our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data.

    +

    On our website https://msberends.github.io/AMR you can find a comprehensive tutorial about how to conduct AMR analysis, the complete documentation of all functions (which reads a lot easier than here in R) and an example analysis using WHONET data. As we would like to better understand the backgrounds and needs of our users, please participate in our survey!

    Examples

    # The 'language' parameter of below functions
    diff --git a/docs/survey.html b/docs/survey.html
    new file mode 100644
    index 00000000..df5ea6de
    --- /dev/null
    +++ b/docs/survey.html
    @@ -0,0 +1,262 @@
    +
    +
    +
    +  
    +  
    +
    +
    +
    +Survey • AMR (for R)
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +  
    +  
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +
    +  
    +
    +  
    +    
    +
    +  
    +
    +
    +  
    +
    +
    diff --git a/git_premaster.sh b/git_premaster.sh
    index 38ac696a..a08cf907 100755
    --- a/git_premaster.sh
    +++ b/git_premaster.sh
    @@ -122,6 +122,8 @@ echo "•••••••••••••••••"
     echo "• Installing..."
     Rscript -e "devtools::install(quiet = TRUE, dependencies = FALSE)"
     Rscript -e "suppressMessages(pkgdown::build_site(lazy = $lazy, examples = FALSE))"
    +# add the survey
    +Rscript -e "source('data-raw/create_survey_page.R')"
     echo
     echo "•••••••••••••••••••••••••"
     echo "• List of changed files •"
    diff --git a/index.md b/index.md
    index 7e628f4f..9f27cb2d 100644
    --- a/index.md
    +++ b/index.md
    @@ -1,7 +1,8 @@
     # `AMR` (for R) 
     
    -> **METHODS PAPER PREPRINTED**  
    -> A methods paper about this package has been preprinted at bioRxiv (DOI: 10.1101/810622). Please click [here for the paper on bioRxiv's publishers page](https://doi.org/10.1101/810622).
    +> *July 2020*
    +> **PLEASE TAKE PART IN OUR SURVEY!** +> Since you are one of our users, we would like to know how you use the package and what it brought you or your organisation. **If you have a minute, please [anonymously fill in this short questionnaire](./survey.html)**. Your valuable input will help to improve the package and its functionalities. You can answer the open questions in either English, Spanish, French, Dutch, or German. Thank you very much in advance! ### What is `AMR` (for R)? @@ -11,13 +12,13 @@ After installing this package, R knows [**~70,000 distinct microbial species**](./reference/microorganisms.html) and all [**~550 antibiotic, antimycotic and antiviral drugs**](./reference/antibiotics.html) by name and code (including ATC, EARS-NET, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data. -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.0 (April 2013). **It was designed to work in any setting, including those with very limited resources**. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the [University of Groningen](https://www.rug.nl), in collaboration with non-profit organisations [Certe Medical Diagnostics and Advice](https://www.certe.nl) and [University Medical Center Groningen](https://www.umcg.nl). This R package is [actively maintained](./news) and is free software (see [Copyright](#copyright)). +This package is [fully independent of any other R package](https://en.wikipedia.org/wiki/Dependency_hell) and works on Windows, macOS and Linux with all versions of R since R-3.0.0 (April 2013). **It was designed to work in any setting, including those with very limited resources**. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the [University of Groningen](https://www.rug.nl), in collaboration with non-profit organisations [Certe Medical Diagnostics and Advice](https://www.certe.nl) and [University Medical Center Groningen](https://www.umcg.nl). This R package is [actively maintained](./news) and is free software (see [Copyright](#copyright)). -
    +

    Used in more than 100 countries
    - Since its first public release in early 2018, this package has been downloaded from more than 100 countries (source: CRAN logs). Click the map to enlarge, to see the names of the countries.



    + Since its first public release in early 2018, this package has been downloaded from more than 100 countries. Click the map to enlarge and to also see the names of the countries.



    #### Partners diff --git a/man/AMR-deprecated.Rd b/man/AMR-deprecated.Rd index 27ef3c16..2600e94b 100644 --- a/man/AMR-deprecated.Rd +++ b/man/AMR-deprecated.Rd @@ -33,7 +33,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{retired}. A retired \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \keyword{internal} diff --git a/man/AMR.Rd b/man/AMR.Rd index 1fca5bdd..f8a7948b 100644 --- a/man/AMR.Rd +++ b/man/AMR.Rd @@ -7,13 +7,15 @@ Welcome to the \code{AMR} package. } \details{ -\code{AMR} is a free and open-source R package to simplify the analysis and prediction of Antimicrobial Resistance (AMR) and to work with microbial and antimicrobial properties by using evidence-based methods. It supports any table format, including WHONET/EARS-Net data. +\code{AMR} is a free, open-source and independent R package 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. Our aim is to provide a standard for clean and reproducible antimicrobial resistance data analysis, that can therefore empower epidemiological analyses to continuously enable surveillance and treatment evaluation in any setting. -We created this package for both academic research and routine analysis at the Faculty of Medical Sciences of the University of Groningen and the Medical Microbiology & Infection Prevention (MMBI) department of the University Medical Center Groningen (UMCG). This R package is actively maintained and free software; you can freely use and distribute it for both personal and commercial (but not patent) purposes under the terms of the GNU General Public License version 2.0 (GPL-2), as published by the Free Software Foundation. +After installing this package, R knows ~70,000 distinct microbial species and all ~550 antibiotic, antimycotic and antiviral drugs by name and code (including ATC, EARS-NET, LOINC and SNOMED CT), and knows all about valid R/SI and MIC values. It supports any data format, including WHONET/EARS-Net data. + +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.0 (April 2013). It was designed to work in any setting, including those with very limited resources. It was created for both routine data analysis and academic research at the Faculty of Medical Sciences of the University of Groningen, in collaboration with non-profit organisations Certe Medical Diagnostics and Advice and University Medical Center Groningen. This R package is actively maintained and free software; you can freely use and distribute it for both personal and commercial (but not patent) purposes under the terms of the GNU General Public License version 2.0 (GPL-2), as published by the Free Software Foundation. This package can be used for: \itemize{ -\item Reference for the taxonomy of microorganisms, since the package contains all microbial (sub)species from the \href{http://www.catalogueoflife.org}{Catalogue of Life} +\item Reference for the taxonomy of microorganisms, since the package contains all microbial (sub)species from the Catalogue of Life and List of Prokaryotic names with Standing in Nomenclature \item Interpreting raw MIC and disk diffusion values, based on the latest CLSI or EUCAST guidelines \item Retrieving antimicrobial drug names, doses and forms of administration from clinical health care records \item Determining first isolates to be used for AMR analysis @@ -22,17 +24,18 @@ This package can be used for: \item Calculating (empirical) susceptibility of both mono therapy and combination therapies \item Predicting future antimicrobial resistance using regression models \item Getting properties for any microorganism (like Gram stain, species, genus or family) -\item Getting properties for any antibiotic (like name, EARS-Net code, ATC code, PubChem code, defined daily dose or trade name) +\item Getting properties for any antibiotic (like name, code of EARS-Net/ATC/LOINC/PubChem, defined daily dose or trade name) \item Plotting antimicrobial resistance -\item Getting SNOMED codes of a microorganism, or get its name associated with a SNOMED code -\item Getting LOINC codes of an antibiotic, or get its name associated with a LOINC code +\item Applying EUCAST expert rules +\item Getting SNOMED codes of a microorganism, or getting properties of a microorganism based on a SNOMED code +\item Getting LOINC codes of an antibiotic, or getting properties of an antibiotic based on a LOINC code \item Machine reading the EUCAST and CLSI guidelines from 2011-2020 to translate MIC values and disk diffusion diameters to R/SI \item Principal component analysis for AMR } } \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \section{Contact Us}{ diff --git a/man/WHOCC.Rd b/man/WHOCC.Rd index 2b7d4c4a..834a9405 100644 --- a/man/WHOCC.Rd +++ b/man/WHOCC.Rd @@ -20,7 +20,7 @@ The WHOCC is located in Oslo at the Norwegian Institute of Public Health and fun \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/WHONET.Rd b/man/WHONET.Rd index 4a46724c..60040285 100644 --- a/man/WHONET.Rd +++ b/man/WHONET.Rd @@ -43,7 +43,7 @@ This example data set has the exact same structure as an export file from WHONET } \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \keyword{datasets} diff --git a/man/ab_from_text.Rd b/man/ab_from_text.Rd index 1d305ecc..4ca3413c 100644 --- a/man/ab_from_text.Rd +++ b/man/ab_from_text.Rd @@ -62,7 +62,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{maturing}. The unly \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/ab_property.Rd b/man/ab_property.Rd index 84551a67..b8f8c475 100644 --- a/man/ab_property.Rd +++ b/man/ab_property.Rd @@ -95,7 +95,7 @@ European Commission Public Health PHARMACEUTICALS - COMMUNITY REGISTER: \url{htt \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/age.Rd b/man/age.Rd index 7778f911..84ebf49d 100644 --- a/man/age.Rd +++ b/man/age.Rd @@ -31,7 +31,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/age_groups.Rd b/man/age_groups.Rd index c1215399..555a0cb5 100644 --- a/man/age_groups.Rd +++ b/man/age_groups.Rd @@ -43,7 +43,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/antibiotics.Rd b/man/antibiotics.Rd index a45258fe..42786711 100644 --- a/man/antibiotics.Rd +++ b/man/antibiotics.Rd @@ -89,7 +89,7 @@ The WHOCC is located in Oslo at the Norwegian Institute of Public Health and fun \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \seealso{ diff --git a/man/as.ab.Rd b/man/as.ab.Rd index 7d43dce5..ec278c2b 100644 --- a/man/as.ab.Rd +++ b/man/as.ab.Rd @@ -65,7 +65,7 @@ The WHOCC is located in Oslo at the Norwegian Institute of Public Health and fun \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/as.disk.Rd b/man/as.disk.Rd index 70e67586..f8b349da 100644 --- a/man/as.disk.Rd +++ b/man/as.disk.Rd @@ -34,7 +34,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/as.mic.Rd b/man/as.mic.Rd index 0f5bb533..6c648cee 100755 --- a/man/as.mic.Rd +++ b/man/as.mic.Rd @@ -34,7 +34,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/as.mo.Rd b/man/as.mo.Rd index 7a1b9295..22dd7f79 100644 --- a/man/as.mo.Rd +++ b/man/as.mo.Rd @@ -148,7 +148,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/as.rsi.Rd b/man/as.rsi.Rd index e434b75d..cbbe38f5 100755 --- a/man/as.rsi.Rd +++ b/man/as.rsi.Rd @@ -64,7 +64,7 @@ When using \code{\link[=as.rsi]{as.rsi()}} on untransformed data, the data will Supported guidelines to be used as input for the \code{guideline} parameter are: "CLSI 2010", "CLSI 2011", "CLSI 2012", "CLSI 2013", "CLSI 2014", "CLSI 2015", "CLSI 2016", "CLSI 2017", "CLSI 2018", "CLSI 2019", "EUCAST 2011", "EUCAST 2012", "EUCAST 2013", "EUCAST 2014", "EUCAST 2015", "EUCAST 2016", "EUCAST 2017", "EUCAST 2018", "EUCAST 2019", "EUCAST 2020". Simply using \code{"CLSI"} or \code{"EUCAST"} for input will automatically select the latest version of that guideline. -The repository of this package \href{https://github.com/msberends/AMR/blob/master/data-raw/rsi_translation.txt}{contains a machine readable version} of all guidelines. This is a CSV file consisting of 18,964 rows and 10 columns. This file is machine readable, since it contains one row for every unique combination of the test method (MIC or disk diffusion), the antimicrobial agent and the microorganism. This \strong{allows for easy implementation of these rules in laboratory information systems (LIS)}. +The repository of this package \href{https://github.com/msberends/AMR/blob/master/data-raw/rsi_translation.txt}{contains a machine readable version} of all guidelines. This is a CSV file consisting of 18,964 rows and 10 columns. This file is machine readable, since it contains one row for every unique combination of the test method (MIC or disk diffusion), the antimicrobial agent and the microorganism. \strong{This allows for easy implementation of these rules in laboratory information systems (LIS)}. After using \code{\link[=as.rsi]{as.rsi()}}, you can use \code{\link[=eucast_rules]{eucast_rules()}} to (1) apply inferred susceptibility and resistance based on results of other antimicrobials and (2) apply intrinsic resistance based on taxonomic properties of a microorganism. @@ -95,7 +95,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/atc_online.Rd b/man/atc_online.Rd index 17ddca8e..d6194485 100644 --- a/man/atc_online.Rd +++ b/man/atc_online.Rd @@ -71,7 +71,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{questioning}. This \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/availability.Rd b/man/availability.Rd index 54f4621a..0004d6ce 100644 --- a/man/availability.Rd +++ b/man/availability.Rd @@ -30,7 +30,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/bug_drug_combinations.Rd b/man/bug_drug_combinations.Rd index de1dfa56..b88afd16 100644 --- a/man/bug_drug_combinations.Rd +++ b/man/bug_drug_combinations.Rd @@ -75,7 +75,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/catalogue_of_life.Rd b/man/catalogue_of_life.Rd index 7a32307d..d19721f5 100644 --- a/man/catalogue_of_life.Rd +++ b/man/catalogue_of_life.Rd @@ -33,7 +33,7 @@ The syntax used to transform the original data to a cleansed R format, can be fo \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/catalogue_of_life_version.Rd b/man/catalogue_of_life_version.Rd index 166a023c..9e048dcf 100644 --- a/man/catalogue_of_life_version.Rd +++ b/man/catalogue_of_life_version.Rd @@ -25,7 +25,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \seealso{ diff --git a/man/count.Rd b/man/count.Rd index eb6c316d..fda1d19e 100644 --- a/man/count.Rd +++ b/man/count.Rd @@ -128,7 +128,7 @@ Using \code{only_all_tested} has no impact when only using one antibiotic as inp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/eucast_rules.Rd b/man/eucast_rules.Rd index 8bbc6e08..13893a70 100644 --- a/man/eucast_rules.Rd +++ b/man/eucast_rules.Rd @@ -161,7 +161,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{maturing}. The unly \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/example_isolates.Rd b/man/example_isolates.Rd index 149957cb..c8e40116 100644 --- a/man/example_isolates.Rd +++ b/man/example_isolates.Rd @@ -27,7 +27,7 @@ A data set containing 2,000 microbial isolates with their full antibiograms. The } \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \keyword{datasets} diff --git a/man/example_isolates_unclean.Rd b/man/example_isolates_unclean.Rd index fdf5dfe4..d2ae9311 100644 --- a/man/example_isolates_unclean.Rd +++ b/man/example_isolates_unclean.Rd @@ -22,7 +22,7 @@ A data set containing 3,000 microbial isolates that are not cleaned up and conse } \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \keyword{datasets} diff --git a/man/filter_ab_class.Rd b/man/filter_ab_class.Rd index 7b9ea39d..96dcd603 100644 --- a/man/filter_ab_class.Rd +++ b/man/filter_ab_class.Rd @@ -71,8 +71,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp } \examples{ -\dontrun{ -library(dplyr) +if (require(dplyr)) { # filter on isolates that have any result for any aminoglycoside example_isolates \%>\% filter_ab_class("aminoglycoside") @@ -102,6 +101,12 @@ example_isolates \%>\% filter_aminoglycosides("R", "all") \%>\% filter_fluoroquinolones("R", "all") } + +\dontrun{ +# with dplyr 1.0.0 and higher (that adds 'across()'), this is equal: +example_isolates \%>\% filter_carbapenems("R", "all") +example_isolates \%>\% filter(across(carbapenems(), ~. == "R")) +} } \seealso{ \code{\link[=antibiotic_class_selectors]{antibiotic_class_selectors()}} for the \code{select()} equivalent. diff --git a/man/first_isolate.Rd b/man/first_isolate.Rd index a25a58f2..b6ddde4f 100755 --- a/man/first_isolate.Rd +++ b/man/first_isolate.Rd @@ -132,7 +132,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/g.test.Rd b/man/g.test.Rd index 18e71e50..b08e4982 100644 --- a/man/g.test.Rd +++ b/man/g.test.Rd @@ -105,7 +105,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{questioning}. This \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/ggplot_pca.Rd b/man/ggplot_pca.Rd index 542fc2fc..a822f2c6 100644 --- a/man/ggplot_pca.Rd +++ b/man/ggplot_pca.Rd @@ -35,6 +35,7 @@ ggplot_pca( arrows_colour = "darkblue", arrows_size = 0.5, arrows_textsize = 3, + arrows_textangled = TRUE, arrows_alpha = 0.75, base_textsize = 10, ... @@ -92,6 +93,8 @@ ggplot_pca( \item{arrows_textsize}{the size of the text at the end of the arrows} +\item{arrows_textangled}{a logical whether the text at the end of the arrows should be angled} + \item{arrows_alpha}{the alpha (transparency) of the arrows and their text} \item{base_textsize}{the text size for all plot elements except the labels and arrows} @@ -114,19 +117,24 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{maturing}. The unly # `example_isolates` is a dataset available in the AMR package. # See ?example_isolates. -\dontrun{ # See ?pca for more info about Principal Component Analysis (PCA). -library(dplyr) -pca_model <- example_isolates \%>\% - filter(mo_genus(mo) == "Staphylococcus") \%>\% - group_by(species = mo_shortname(mo)) \%>\% - summarise_if (is.rsi, resistance) \%>\% - pca(FLC, AMC, CXM, GEN, TOB, TMP, SXT, CIP, TEC, TCY, ERY) +if (require("dplyr")) { + pca_model <- example_isolates \%>\% + filter(mo_genus(mo) == "Staphylococcus") \%>\% + group_by(species = mo_shortname(mo)) \%>\% + summarise_if (is.rsi, resistance) \%>\% + pca(FLC, AMC, CXM, GEN, TOB, TMP, SXT, CIP, TEC, TCY, ERY) + + # old (base R) + biplot(pca_model) -# old -biplot(pca_model) - -# new -ggplot_pca(pca_model) + # new + ggplot_pca(pca_model) + + if (require("ggplot2")) { + ggplot_pca(pca_model) + + scale_colour_viridis_d() + + labs(title = "Title here") + } } } diff --git a/man/ggplot_rsi.Rd b/man/ggplot_rsi.Rd index 88f65253..07459270 100644 --- a/man/ggplot_rsi.Rd +++ b/man/ggplot_rsi.Rd @@ -143,7 +143,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{maturing}. The unly \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/guess_ab_col.Rd b/man/guess_ab_col.Rd index 71b1931a..87df0c52 100644 --- a/man/guess_ab_col.Rd +++ b/man/guess_ab_col.Rd @@ -30,7 +30,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{maturing}. The unly \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/join.Rd b/man/join.Rd index d439e3a6..93812b00 100755 --- a/man/join.Rd +++ b/man/join.Rd @@ -50,7 +50,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/key_antibiotics.Rd b/man/key_antibiotics.Rd index 236a8d7a..eeafcf9d 100755 --- a/man/key_antibiotics.Rd +++ b/man/key_antibiotics.Rd @@ -129,7 +129,7 @@ A difference from I to S|R (or vice versa) means 0.5 points, a difference from S \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/kurtosis.Rd b/man/kurtosis.Rd index 8afada07..815025d3 100644 --- a/man/kurtosis.Rd +++ b/man/kurtosis.Rd @@ -31,7 +31,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{questioning}. This \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \seealso{ diff --git a/man/like.Rd b/man/like.Rd index 604cddb3..ed322c12 100755 --- a/man/like.Rd +++ b/man/like.Rd @@ -49,7 +49,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/mdro.Rd b/man/mdro.Rd index fadb959b..f6d29f13 100644 --- a/man/mdro.Rd +++ b/man/mdro.Rd @@ -202,7 +202,7 @@ This AMR package honours this new insight. Use \code{\link[=susceptibility]{susc \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/microorganisms.Rd b/man/microorganisms.Rd index afd9f2c7..1da714b3 100755 --- a/man/microorganisms.Rd +++ b/man/microorganisms.Rd @@ -74,7 +74,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \seealso{ diff --git a/man/microorganisms.codes.Rd b/man/microorganisms.codes.Rd index 77837762..27b36fe1 100644 --- a/man/microorganisms.codes.Rd +++ b/man/microorganisms.codes.Rd @@ -27,7 +27,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \seealso{ diff --git a/man/microorganisms.old.Rd b/man/microorganisms.old.Rd index 9fa49392..bb259832 100644 --- a/man/microorganisms.old.Rd +++ b/man/microorganisms.old.Rd @@ -34,7 +34,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \seealso{ diff --git a/man/mo_property.Rd b/man/mo_property.Rd index 9c9ac9cb..8f72e187 100644 --- a/man/mo_property.Rd +++ b/man/mo_property.Rd @@ -144,7 +144,7 @@ This package contains the complete taxonomic tree of almost all microorganisms ( \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/mo_source.Rd b/man/mo_source.Rd index 5c759c8d..95f28f61 100644 --- a/man/mo_source.Rd +++ b/man/mo_source.Rd @@ -91,6 +91,6 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } diff --git a/man/p_symbol.Rd b/man/p_symbol.Rd index c604964a..f6da7c36 100644 --- a/man/p_symbol.Rd +++ b/man/p_symbol.Rd @@ -25,6 +25,6 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{questioning}. This \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } diff --git a/man/proportion.Rd b/man/proportion.Rd index b62507bf..99156bc1 100644 --- a/man/proportion.Rd +++ b/man/proportion.Rd @@ -143,7 +143,7 @@ This AMR package honours this new insight. Use \code{\link[=susceptibility]{susc \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/resistance_predict.Rd b/man/resistance_predict.Rd index c44bba5d..8fffc0b0 100644 --- a/man/resistance_predict.Rd +++ b/man/resistance_predict.Rd @@ -123,7 +123,7 @@ This AMR package honours this new insight. Use \code{\link[=susceptibility]{susc \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/man/rsi_translation.Rd b/man/rsi_translation.Rd index 7b2134f2..0d1891a3 100644 --- a/man/rsi_translation.Rd +++ b/man/rsi_translation.Rd @@ -30,7 +30,7 @@ The repository of this \code{AMR} package contains a file comprising this exact } \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \keyword{datasets} diff --git a/man/skewness.Rd b/man/skewness.Rd index 986a79f8..ca24255a 100644 --- a/man/skewness.Rd +++ b/man/skewness.Rd @@ -33,7 +33,7 @@ The \link[=lifecycle]{lifecycle} of this function is \strong{questioning}. This \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \seealso{ diff --git a/man/translate.Rd b/man/translate.Rd index 4f0bfd6c..6cbdb57e 100644 --- a/man/translate.Rd +++ b/man/translate.Rd @@ -31,7 +31,7 @@ If the unlying code needs breaking changes, they will occur gradually. For examp \section{Read more on our website!}{ -On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. +On our website \url{https://msberends.github.io/AMR} you can find \href{https://msberends.github.io/AMR/articles/AMR.html}{a comprehensive tutorial} about how to conduct AMR analysis, the \href{https://msberends.github.io/AMR/reference}{complete documentation of all functions} (which reads a lot easier than here in R) and \href{https://msberends.github.io/AMR/articles/WHONET.html}{an example analysis using WHONET data}. As we would like to better understand the backgrounds and needs of our users, please \href{https://msberends.github.io/AMR/survey.html}{participate in our survey}! } \examples{ diff --git a/pkgdown/extra.css b/pkgdown/extra.css index 5886f420..5cc5b30c 100644 --- a/pkgdown/extra.css +++ b/pkgdown/extra.css @@ -117,11 +117,17 @@ li, p { li p { margin-top: 10.5px; } +.template-news li p { + margin: 0; +} /* slightly smaller blockquote */ blockquote { font-size: 98%; } +.template-home blockquote { + border: 5px solid #128f7645 !important; +} /* 2nd list in navigation should be smaller */ #tocnav li li { diff --git a/pkgdown/logos/countries.png b/pkgdown/logos/countries.png index 31fc19e1..a6e82d12 100644 Binary files a/pkgdown/logos/countries.png and b/pkgdown/logos/countries.png differ diff --git a/pkgdown/logos/countries_large.png b/pkgdown/logos/countries_large.png index 262b394b..0a5cd21f 100644 Binary files a/pkgdown/logos/countries_large.png and b/pkgdown/logos/countries_large.png differ diff --git a/tests/testthat/test-pca.R b/tests/testthat/test-pca.R index 82f3ccc0..b2bb2ba6 100644 --- a/tests/testthat/test-pca.R +++ b/tests/testthat/test-pca.R @@ -42,4 +42,5 @@ test_that("PCA works", { expect_s3_class(pca_model, "pca") ggplot_pca(pca_model, ellipse = TRUE) + ggplot_pca(pca_model, arrows_textangled = FALSE) }) diff --git a/vignettes/PCA.Rmd b/vignettes/PCA.Rmd index dfa512f7..7ace8921 100755 --- a/vignettes/PCA.Rmd +++ b/vignettes/PCA.Rmd @@ -7,7 +7,7 @@ output: toc: true toc_depth: 3 vignette: > - %\VignetteIndexEntry{Benchmarks} + %\VignetteIndexEntry{How to conduct principal component analysis (PCA) for AMR} %\VignetteEncoding{UTF-8} %\VignetteEngine{knitr::rmarkdown} editor_options: