2019-03-15 13:57:25 +01:00
|
|
|
# ==================================================================== #
|
|
|
|
# TITLE #
|
|
|
|
# Antimicrobial Resistance (AMR) Analysis #
|
|
|
|
# #
|
|
|
|
# SOURCE #
|
|
|
|
# https://gitlab.com/msberends/AMR #
|
|
|
|
# #
|
|
|
|
# LICENCE #
|
|
|
|
# (c) 2019 Berends MS (m.s.berends@umcg.nl), Luz CF (c.f.luz@umcg.nl) #
|
|
|
|
# #
|
|
|
|
# This R package is free software; you can freely use and distribute #
|
|
|
|
# it for both personal and commercial purposes under the terms of the #
|
|
|
|
# GNU General Public License version 2.0 (GNU GPL-2), as published by #
|
|
|
|
# the Free Software Foundation. #
|
|
|
|
# #
|
|
|
|
# This R package was created for academic research and was publicly #
|
|
|
|
# released in the hope that it will be useful, but it comes WITHOUT #
|
|
|
|
# ANY WARRANTY OR LIABILITY. #
|
2019-04-05 18:47:39 +02:00
|
|
|
# Visit our website for more info: https://msberends.gitlab.io/AMR. #
|
2019-03-15 13:57:25 +01:00
|
|
|
# ==================================================================== #
|
|
|
|
|
2019-09-15 22:57:30 +02:00
|
|
|
# print successful as.mo coercions to a options entry
|
2019-03-18 14:29:41 +01:00
|
|
|
#' @importFrom dplyr %>% distinct filter
|
2019-09-16 12:00:56 +02:00
|
|
|
#' @importFrom utils write.csv
|
2019-09-15 22:57:30 +02:00
|
|
|
set_mo_history <- function(x, mo, uncertainty_level, force = FALSE, disable = FALSE) {
|
|
|
|
if (isTRUE(disable)) {
|
|
|
|
return(base::invisible())
|
|
|
|
}
|
|
|
|
|
2019-09-23 17:32:05 +02:00
|
|
|
# don't save codes that are in a code data set already
|
|
|
|
mo <- mo[!x %in% microorganisms.codes$code & !x %in% microorganisms.translation$mo_old]
|
|
|
|
x <- x[!x %in% microorganisms.codes$code & !x %in% microorganisms.translation$mo_old]
|
|
|
|
|
2019-09-23 23:09:50 +02:00
|
|
|
warning_new_write <- FALSE
|
|
|
|
|
2019-09-15 22:57:30 +02:00
|
|
|
if (base::interactive() | force == TRUE) {
|
|
|
|
mo_hist <- read_mo_history(uncertainty_level = uncertainty_level, force = force)
|
|
|
|
df <- data.frame(x, mo, stringsAsFactors = FALSE) %>%
|
|
|
|
distinct(x, .keep_all = TRUE) %>%
|
|
|
|
filter(!is.na(x) & !is.na(mo))
|
|
|
|
if (nrow(df) == 0) {
|
|
|
|
return(base::invisible())
|
|
|
|
}
|
|
|
|
x <- toupper(df$x)
|
|
|
|
mo <- df$mo
|
2019-10-11 17:21:02 +02:00
|
|
|
for (i in seq_len(length(x))) {
|
2019-09-15 22:57:30 +02:00
|
|
|
# save package version too, as both the as.mo() algorithm and the reference data set may change
|
|
|
|
if (NROW(mo_hist[base::which(mo_hist$x == x[i] &
|
|
|
|
mo_hist$uncertainty_level >= uncertainty_level &
|
2019-10-11 17:21:02 +02:00
|
|
|
mo_hist$package_version == utils::packageVersion("AMR")), ]) == 0) {
|
2019-09-15 22:57:30 +02:00
|
|
|
# # Not using the file system:
|
|
|
|
# tryCatch(options(mo_remembered_results = rbind(mo_hist,
|
|
|
|
# data.frame(
|
|
|
|
# x = x[i],
|
|
|
|
# mo = mo[i],
|
|
|
|
# uncertainty_level = uncertainty_level,
|
2019-09-16 12:00:56 +02:00
|
|
|
# package_version = base::as.character(utils::packageVersion("AMR")),
|
2019-09-15 22:57:30 +02:00
|
|
|
# stringsAsFactors = FALSE))),
|
|
|
|
# error = function(e) base::invisible())
|
|
|
|
# # don't remember more than 1,000 different input values
|
|
|
|
# if (tryCatch(nrow(getOption("mo_remembered_results")), error = function(e) 1001) > 1000) {
|
|
|
|
# return(base::invisible())
|
|
|
|
# }
|
2019-09-23 23:00:18 +02:00
|
|
|
if (is.null(mo_hist) & interactive()) {
|
2019-09-22 12:41:45 +02:00
|
|
|
warning_new_write <- TRUE
|
2019-09-15 22:57:30 +02:00
|
|
|
}
|
|
|
|
tryCatch(write.csv(rbind(mo_hist,
|
|
|
|
data.frame(
|
|
|
|
x = x[i],
|
|
|
|
mo = mo[i],
|
|
|
|
uncertainty_level = uncertainty_level,
|
2019-09-16 12:00:56 +02:00
|
|
|
package_version = base::as.character(utils::packageVersion("AMR")),
|
2019-09-15 22:57:30 +02:00
|
|
|
stringsAsFactors = FALSE)),
|
2019-09-16 12:00:56 +02:00
|
|
|
row.names = FALSE,
|
|
|
|
file = mo_history_file()),
|
2019-10-11 17:21:02 +02:00
|
|
|
error = function(e) {
|
|
|
|
warning_new_write <- FALSE; base::invisible()
|
|
|
|
})
|
2019-09-15 22:57:30 +02:00
|
|
|
}
|
|
|
|
}
|
|
|
|
}
|
2019-09-23 23:00:18 +02:00
|
|
|
if (warning_new_write == TRUE) {
|
|
|
|
message(blue(paste0("NOTE: results are saved to ", mo_history_file(), ".")))
|
|
|
|
}
|
2019-04-06 09:38:23 +02:00
|
|
|
return(base::invisible())
|
2019-03-15 13:57:25 +01:00
|
|
|
}
|
|
|
|
|
2019-09-15 22:57:30 +02:00
|
|
|
get_mo_history <- function(x, uncertainty_level, force = FALSE, disable = FALSE) {
|
|
|
|
if (isTRUE(disable)) {
|
|
|
|
return(to_class_mo(NA))
|
|
|
|
}
|
2019-10-11 17:21:02 +02:00
|
|
|
|
2019-09-15 22:57:30 +02:00
|
|
|
history <- read_mo_history(uncertainty_level = uncertainty_level, force = force)
|
|
|
|
if (base::is.null(history)) {
|
|
|
|
result <- NA
|
|
|
|
} else {
|
2019-09-18 15:46:09 +02:00
|
|
|
result <- data.frame(x = as.character(toupper(x)), stringsAsFactors = FALSE) %>%
|
2019-09-15 22:57:30 +02:00
|
|
|
left_join(history, by = "x") %>%
|
|
|
|
pull(mo)
|
|
|
|
}
|
|
|
|
to_class_mo(result)
|
2019-03-15 13:57:25 +01:00
|
|
|
}
|
|
|
|
|
2019-03-15 17:36:42 +01:00
|
|
|
#' @importFrom dplyr %>% filter distinct
|
2019-09-16 12:00:56 +02:00
|
|
|
#' @importFrom utils read.csv
|
2019-09-15 22:57:30 +02:00
|
|
|
read_mo_history <- function(uncertainty_level = 2, force = FALSE, unfiltered = FALSE, disable = FALSE) {
|
|
|
|
if (isTRUE(disable)) {
|
|
|
|
return(NULL)
|
|
|
|
}
|
2019-10-11 17:21:02 +02:00
|
|
|
|
2019-09-15 22:57:30 +02:00
|
|
|
if ((!base::interactive() & force == FALSE)) {
|
|
|
|
return(NULL)
|
|
|
|
}
|
|
|
|
uncertainty_level_param <- uncertainty_level
|
|
|
|
|
|
|
|
# # Not using the file system:
|
|
|
|
# history <- tryCatch(getOption("mo_remembered_results"),
|
|
|
|
# error = function(e) NULL)
|
2019-09-16 12:00:56 +02:00
|
|
|
history <- tryCatch(read.csv(mo_history_file(), stringsAsFactors = FALSE),
|
2019-09-15 22:57:30 +02:00
|
|
|
warning = function(w) invisible(),
|
|
|
|
error = function(e) NULL)
|
|
|
|
if (is.null(history)) {
|
|
|
|
return(NULL)
|
|
|
|
}
|
|
|
|
# Below: filter on current package version.
|
|
|
|
# Even current fullnames may be replaced by new taxonomic names, so new versions of
|
|
|
|
# the Catalogue of Life must not lead to data corruption.
|
2019-10-11 17:21:02 +02:00
|
|
|
|
2019-09-15 22:57:30 +02:00
|
|
|
if (unfiltered == FALSE) {
|
|
|
|
history <- history %>%
|
2019-09-16 12:00:56 +02:00
|
|
|
filter(package_version == as.character(utils::packageVersion("AMR")),
|
2019-09-15 22:57:30 +02:00
|
|
|
# only take unknowns if uncertainty_level_param is higher
|
|
|
|
((mo == "UNKNOWN" & uncertainty_level_param == uncertainty_level) |
|
|
|
|
(mo != "UNKNOWN" & uncertainty_level_param >= uncertainty_level))) %>%
|
|
|
|
arrange(desc(uncertainty_level)) %>%
|
|
|
|
distinct(x, mo, .keep_all = TRUE)
|
|
|
|
}
|
2019-10-11 17:21:02 +02:00
|
|
|
|
2019-09-15 22:57:30 +02:00
|
|
|
if (nrow(history) == 0) {
|
|
|
|
NULL
|
|
|
|
} else {
|
|
|
|
history
|
|
|
|
}
|
2019-03-15 13:57:25 +01:00
|
|
|
}
|
|
|
|
|
2019-09-15 22:57:30 +02:00
|
|
|
#' @rdname as.mo
|
|
|
|
#' @importFrom crayon red
|
|
|
|
#' @importFrom utils menu
|
|
|
|
#' @export
|
|
|
|
clear_mo_history <- function(...) {
|
|
|
|
if (!is.null(read_mo_history())) {
|
|
|
|
if (interactive() & !isTRUE(list(...)$force)) {
|
|
|
|
q <- menu(title = paste("This will clear all",
|
|
|
|
format(nrow(read_mo_history(999, unfiltered = TRUE)), big.mark = ","),
|
|
|
|
"previously determined microbial IDs. Are you sure?"),
|
|
|
|
choices = c("Yes", "No"),
|
|
|
|
graphics = FALSE)
|
|
|
|
if (q != 1) {
|
|
|
|
return(invisible())
|
|
|
|
}
|
|
|
|
}
|
|
|
|
# # Not using the file system:
|
|
|
|
# success <- tryCatch(options(mo_remembered_results = NULL),
|
|
|
|
# error = function(e) FALSE)
|
|
|
|
success <- create_blank_mo_history()
|
|
|
|
if (!isFALSE(success)) {
|
2019-09-16 12:00:56 +02:00
|
|
|
cat(red(paste("File", mo_history_file(), "cleared.")))
|
2019-09-15 22:57:30 +02:00
|
|
|
}
|
|
|
|
}
|
2019-03-15 13:57:25 +01:00
|
|
|
}
|
|
|
|
|
2019-09-16 12:00:56 +02:00
|
|
|
#' @importFrom utils write.csv
|
2019-09-15 22:57:30 +02:00
|
|
|
create_blank_mo_history <- function() {
|
|
|
|
tryCatch(
|
|
|
|
write.csv(x = data.frame(x = character(0),
|
|
|
|
mo = character(0),
|
|
|
|
uncertainty_level = integer(0),
|
2019-09-16 12:00:56 +02:00
|
|
|
package_version = character(0),
|
2019-09-15 22:57:30 +02:00
|
|
|
stringsAsFactors = FALSE),
|
2019-09-16 12:00:56 +02:00
|
|
|
row.names = FALSE,
|
|
|
|
file = mo_history_file()),
|
2019-09-15 22:57:30 +02:00
|
|
|
warning = function(w) invisible(),
|
|
|
|
error = function(e) TRUE)
|
|
|
|
}
|
2019-09-16 12:00:56 +02:00
|
|
|
|
|
|
|
|
|
|
|
# Borrowed all below code from the extrafont package,
|
|
|
|
# https://github.com/wch/extrafont/blob/254c3f99b02f11adb59affbda699a92aec8624f5/R/utils.r
|
|
|
|
inst_path <- function() {
|
|
|
|
envname <- environmentName(parent.env(environment()))
|
|
|
|
|
|
|
|
# If installed in package, envname == "AMR"
|
|
|
|
# If loaded with load_all, envname == "package:AMR"
|
|
|
|
# (This is kind of strange)
|
|
|
|
if (envname == "AMR") {
|
|
|
|
system.file(package = "AMR")
|
|
|
|
} else {
|
|
|
|
srcfile <- attr(attr(inst_path, "srcref"), "srcfile")
|
|
|
|
file.path(dirname(dirname(srcfile$filename)), "inst")
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
|
|
|
|
# Get the path where extrafontdb is installed
|
|
|
|
db_path <- function() {
|
|
|
|
system.file(package = "AMR")
|
|
|
|
}
|
|
|
|
|
|
|
|
# fonttable file
|
|
|
|
mo_history_file <- function() {
|
|
|
|
file.path(mo_history_path(), "mo_history.csv")
|
|
|
|
}
|
|
|
|
|
|
|
|
# Path of fontmap directory
|
|
|
|
mo_history_path <- function() {
|
|
|
|
file.path(db_path(), "mo_history")
|
|
|
|
}
|