2018-02-21 11:52:31 +01:00
|
|
|
# ==================================================================== #
|
|
|
|
# TITLE #
|
2020-10-08 11:16:03 +02:00
|
|
|
# Antimicrobial Resistance (AMR) Analysis for R #
|
2018-02-21 11:52:31 +01:00
|
|
|
# #
|
2019-01-02 23:24:07 +01:00
|
|
|
# SOURCE #
|
2020-07-08 14:48:06 +02:00
|
|
|
# https://github.com/msberends/AMR #
|
2018-02-21 11:52:31 +01:00
|
|
|
# #
|
|
|
|
# LICENCE #
|
2020-01-05 17:22:09 +01:00
|
|
|
# (c) 2018-2020 Berends MS, Luz CF et al. #
|
2020-10-08 11:16:03 +02:00
|
|
|
# Developed at the University of Groningen, the Netherlands, in #
|
|
|
|
# collaboration with non-profit organisations Certe Medical #
|
2020-10-26 12:23:03 +01:00
|
|
|
# Diagnostics & Advice, and University Medical Center Groningen. #
|
2018-02-21 11:52:31 +01:00
|
|
|
# #
|
2019-01-02 23:24:07 +01:00
|
|
|
# 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. #
|
2020-01-05 17:22:09 +01:00
|
|
|
# We created this package for both routine data analysis and academic #
|
|
|
|
# research and it was publicly released in the hope that it will be #
|
|
|
|
# useful, but it comes WITHOUT ANY WARRANTY OR LIABILITY. #
|
2020-10-08 11:16:03 +02:00
|
|
|
# #
|
|
|
|
# Visit our website for the full manual and a complete tutorial about #
|
|
|
|
# how to conduct AMR analysis: https://msberends.github.io/AMR/ #
|
2018-02-21 11:52:31 +01:00
|
|
|
# ==================================================================== #
|
|
|
|
|
2020-09-03 12:31:48 +02:00
|
|
|
# faster implementation of left_join than using merge() by poorman - we use match():
|
2020-09-18 16:05:53 +02:00
|
|
|
pm_left_join <- function(x, y, by = NULL, suffix = c(".x", ".y")) {
|
2020-08-14 13:36:10 +02:00
|
|
|
if (is.null(by)) {
|
|
|
|
by <- intersect(names(x), names(y))[1L]
|
|
|
|
if (is.na(by)) {
|
2020-09-18 16:05:53 +02:00
|
|
|
stop_("no common column found for pm_left_join()")
|
2020-08-14 13:36:10 +02:00
|
|
|
}
|
2020-09-19 11:54:01 +02:00
|
|
|
pm_join_message(by)
|
2020-08-14 13:36:10 +02:00
|
|
|
} else if (!is.null(names(by))) {
|
|
|
|
by <- unname(c(names(by), by))
|
|
|
|
}
|
|
|
|
if (length(by) == 1) {
|
|
|
|
by <- rep(by, 2)
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-08-15 12:54:47 +02:00
|
|
|
int_x <- colnames(x) %in% colnames(y) & colnames(x) != by[1]
|
|
|
|
int_y <- colnames(y) %in% colnames(x) & colnames(y) != by[2]
|
|
|
|
colnames(x)[int_x] <- paste0(colnames(x)[int_x], suffix[1L])
|
|
|
|
colnames(y)[int_y] <- paste0(colnames(y)[int_y], suffix[2L])
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-08-14 13:36:10 +02:00
|
|
|
merged <- cbind(x,
|
|
|
|
y[match(x[, by[1], drop = TRUE],
|
|
|
|
y[, by[2], drop = TRUE]),
|
|
|
|
colnames(y)[!colnames(y) %in% colnames(x) & !colnames(y) == by[2]],
|
|
|
|
drop = FALSE])
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-08-14 13:36:10 +02:00
|
|
|
rownames(merged) <- NULL
|
|
|
|
merged
|
|
|
|
}
|
2020-09-18 16:05:53 +02:00
|
|
|
|
|
|
|
quick_case_when <- function(...) {
|
|
|
|
vectors <- list(...)
|
|
|
|
split <- lapply(vectors, function(x) unlist(strsplit(paste(deparse(x), collapse = ""), "~", fixed = TRUE)))
|
|
|
|
for (i in seq_len(length(vectors))) {
|
|
|
|
if (eval(parse(text = split[[i]][1]), envir = parent.frame())) {
|
|
|
|
return(eval(parse(text = split[[i]][2]), envir = parent.frame()))
|
|
|
|
}
|
2020-05-16 13:05:47 +02:00
|
|
|
}
|
2020-09-18 16:05:53 +02:00
|
|
|
return(NA)
|
2020-05-16 13:05:47 +02:00
|
|
|
}
|
|
|
|
|
2018-07-04 17:20:03 +02:00
|
|
|
# No export, no Rd
|
|
|
|
addin_insert_in <- function() {
|
2020-06-17 15:14:37 +02:00
|
|
|
import_fn("insertText", "rstudioapi")(" %in% ")
|
2018-07-04 17:20:03 +02:00
|
|
|
}
|
|
|
|
|
|
|
|
# No export, no Rd
|
|
|
|
addin_insert_like <- function() {
|
2020-11-23 21:50:27 +01:00
|
|
|
import_fn("insertText", "rstudioapi")(" %like% ")
|
2018-07-04 17:20:03 +02:00
|
|
|
}
|
|
|
|
|
2020-02-14 19:54:13 +01:00
|
|
|
check_dataset_integrity <- function() {
|
2020-07-28 18:39:57 +02:00
|
|
|
# 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]
|
2020-09-24 00:30:11 +02:00
|
|
|
# exception for example_isolates
|
|
|
|
overwritten <- overwritten[overwritten != "example_isolates"]
|
2020-07-28 18:39:57 +02:00
|
|
|
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
|
2020-02-16 22:43:56 +01:00
|
|
|
tryCatch({
|
|
|
|
check_microorganisms <- all(c("mo", "fullname", "kingdom", "phylum",
|
2020-10-26 12:23:03 +01:00
|
|
|
"class", "order", "family", "genus",
|
2020-02-16 22:43:56 +01:00
|
|
|
"species", "subspecies", "rank",
|
2020-05-27 16:37:49 +02:00
|
|
|
"species_id", "source", "ref", "prevalence") %in% colnames(microorganisms),
|
2020-07-08 14:48:06 +02:00
|
|
|
na.rm = TRUE)
|
2020-10-26 12:23:03 +01:00
|
|
|
check_antibiotics <- all(c("ab", "atc", "cid", "name", "group",
|
2020-02-16 22:43:56 +01:00
|
|
|
"atc_group1", "atc_group2", "abbreviations",
|
2020-10-26 12:23:03 +01:00
|
|
|
"synonyms", "oral_ddd", "oral_units",
|
2020-02-16 22:43:56 +01:00
|
|
|
"iv_ddd", "iv_units", "loinc") %in% colnames(antibiotics),
|
|
|
|
na.rm = TRUE)
|
2020-08-14 13:36:10 +02:00
|
|
|
}, error = function(e) {
|
|
|
|
# package not yet loaded
|
|
|
|
require("AMR")
|
|
|
|
})
|
2020-02-14 19:54:13 +01:00
|
|
|
invisible(TRUE)
|
2019-11-23 12:39:57 +01:00
|
|
|
}
|
|
|
|
|
2020-09-24 00:30:11 +02:00
|
|
|
search_type_in_df <- function(x, type, info = TRUE) {
|
2020-11-17 16:57:41 +01:00
|
|
|
meet_criteria(x, allow_class = "data.frame")
|
|
|
|
meet_criteria(type, allow_class = "character", has_length = 1)
|
|
|
|
|
2019-01-15 12:45:24 +01:00
|
|
|
# try to find columns based on type
|
|
|
|
found <- NULL
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-11-17 16:57:41 +01:00
|
|
|
# remove attributes from other packages
|
2020-05-16 13:05:47 +02:00
|
|
|
x <- as.data.frame(x, stringsAsFactors = FALSE)
|
2019-05-23 16:58:59 +02:00
|
|
|
colnames(x) <- trimws(colnames(x))
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2019-01-15 12:45:24 +01:00
|
|
|
# -- mo
|
|
|
|
if (type == "mo") {
|
2020-06-11 20:03:13 +02:00
|
|
|
if (any(sapply(x, is.mo))) {
|
|
|
|
found <- sort(colnames(x)[sapply(x, is.mo)])[1]
|
2019-11-04 12:08:08 +01:00
|
|
|
} else if ("mo" %in% colnames(x) &
|
|
|
|
suppressWarnings(
|
|
|
|
all(x$mo %in% c(NA,
|
|
|
|
microorganisms$mo,
|
|
|
|
microorganisms.translation$mo_old)))) {
|
|
|
|
found <- "mo"
|
2020-06-11 20:03:13 +02:00
|
|
|
} else if (any(colnames(x) %like% "^(mo|microorganism|organism|bacteria|ba[ck]terie)s?$")) {
|
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "^(mo|microorganism|organism|bacteria|ba[ck]terie)s?$"])[1]
|
|
|
|
} else if (any(colnames(x) %like% "^(microorganism|organism|bacteria|ba[ck]terie)")) {
|
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "^(microorganism|organism|bacteria|ba[ck]terie)"])[1]
|
2019-05-23 16:58:59 +02:00
|
|
|
} else if (any(colnames(x) %like% "species")) {
|
2020-06-11 20:03:13 +02:00
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "species"])[1]
|
2019-01-15 12:45:24 +01:00
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2019-01-15 12:45:24 +01:00
|
|
|
}
|
|
|
|
# -- key antibiotics
|
|
|
|
if (type == "keyantibiotics") {
|
2019-05-23 16:58:59 +02:00
|
|
|
if (any(colnames(x) %like% "^key.*(ab|antibiotics)")) {
|
2020-06-11 20:03:13 +02:00
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "^key.*(ab|antibiotics)"])[1]
|
2019-01-15 12:45:24 +01:00
|
|
|
}
|
|
|
|
}
|
|
|
|
# -- date
|
|
|
|
if (type == "date") {
|
2019-05-23 16:58:59 +02:00
|
|
|
if (any(colnames(x) %like% "^(specimen date|specimen_date|spec_date)")) {
|
2019-03-15 13:57:25 +01:00
|
|
|
# WHONET support
|
2020-06-11 20:03:13 +02:00
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "^(specimen date|specimen_date|spec_date)"])[1]
|
2020-09-18 16:05:53 +02:00
|
|
|
if (!any(class(pm_pull(x, found)) %in% c("Date", "POSIXct"))) {
|
2020-12-03 16:59:04 +01:00
|
|
|
stop(font_red(paste0("Found column '", font_bold(found), "' to be used as input for `col_", type,
|
2020-06-11 20:03:13 +02:00
|
|
|
"`, but this column contains no valid dates. Transform its values to valid dates first.")),
|
2019-03-15 13:57:25 +01:00
|
|
|
call. = FALSE)
|
|
|
|
}
|
2020-06-11 20:03:13 +02:00
|
|
|
} else if (any(sapply(x, function(x) inherits(x, c("Date", "POSIXct"))))) {
|
|
|
|
found <- sort(colnames(x)[sapply(x, function(x) inherits(x, c("Date", "POSIXct")))])[1]
|
2019-01-15 12:45:24 +01:00
|
|
|
}
|
|
|
|
}
|
|
|
|
# -- patient id
|
|
|
|
if (type == "patient_id") {
|
2019-05-23 16:58:59 +02:00
|
|
|
if (any(colnames(x) %like% "^(identification |patient|patid)")) {
|
2020-06-11 20:03:13 +02:00
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "^(identification |patient|patid)"])[1]
|
2019-01-29 00:06:50 +01:00
|
|
|
}
|
|
|
|
}
|
|
|
|
# -- specimen
|
|
|
|
if (type == "specimen") {
|
2019-05-23 16:58:59 +02:00
|
|
|
if (any(colnames(x) %like% "(specimen type|spec_type)")) {
|
2020-06-11 20:03:13 +02:00
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "(specimen type|spec_type)"])[1]
|
2019-05-23 16:58:59 +02:00
|
|
|
} else if (any(colnames(x) %like% "^(specimen)")) {
|
2020-06-11 20:03:13 +02:00
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "^(specimen)"])[1]
|
2019-01-15 12:45:24 +01:00
|
|
|
}
|
|
|
|
}
|
2020-02-20 13:19:23 +01:00
|
|
|
# -- UTI (urinary tract infection)
|
|
|
|
if (type == "uti") {
|
|
|
|
if (any(colnames(x) == "uti")) {
|
|
|
|
found <- colnames(x)[colnames(x) == "uti"][1]
|
|
|
|
} else if (any(colnames(x) %like% "(urine|urinary)")) {
|
2020-06-11 20:03:13 +02:00
|
|
|
found <- sort(colnames(x)[colnames(x) %like% "(urine|urinary)"])[1]
|
2020-02-20 13:19:23 +01:00
|
|
|
}
|
|
|
|
if (!is.null(found)) {
|
2020-02-21 21:13:38 +01:00
|
|
|
# this column should contain logicals
|
2020-02-20 13:19:23 +01:00
|
|
|
if (!is.logical(x[, found, drop = TRUE])) {
|
2020-12-03 16:59:04 +01:00
|
|
|
message_("Column '", font_bold(found), "' found as input for `col_", type,
|
2020-10-27 15:56:51 +01:00
|
|
|
"`, but this column does not contain 'logical' values (TRUE/FALSE) and was ignored.",
|
|
|
|
add_fn = font_red)
|
2020-02-20 13:19:23 +01:00
|
|
|
found <- NULL
|
|
|
|
}
|
|
|
|
}
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-09-24 00:30:11 +02:00
|
|
|
if (!is.null(found) & info == TRUE) {
|
2020-12-03 16:59:04 +01:00
|
|
|
msg <- paste0("Using column '", found, "' as input for `col_", type, "`.")
|
2019-01-29 00:06:50 +01:00
|
|
|
if (type %in% c("keyantibiotics", "specimen")) {
|
2020-05-16 13:05:47 +02:00
|
|
|
msg <- paste(msg, "Use", font_bold(paste0("col_", type), "= FALSE"), "to prevent this.")
|
2019-01-15 12:45:24 +01:00
|
|
|
}
|
2020-10-27 15:56:51 +01:00
|
|
|
message_(msg)
|
2019-01-15 12:45:24 +01:00
|
|
|
}
|
|
|
|
found
|
|
|
|
}
|
2019-03-26 14:24:03 +01:00
|
|
|
|
2020-09-24 00:30:11 +02:00
|
|
|
is_possibly_regex <- function(x) {
|
2020-10-04 19:26:43 +02:00
|
|
|
tryCatch(sapply(strsplit(x, ""),
|
|
|
|
function(y) any(y %in% c("$", "(", ")", "*", "+", "-", ".", "?", "[", "]", "^", "{", "|", "}", "\\"), na.rm = TRUE)),
|
|
|
|
error = function(e) rep(TRUE, length(x)))
|
2020-09-24 00:30:11 +02:00
|
|
|
}
|
|
|
|
|
2020-06-22 11:18:40 +02:00
|
|
|
stop_ifnot_installed <- function(package) {
|
2019-06-01 20:40:49 +02:00
|
|
|
# no "utils::installed.packages()" since it requires non-staged install since R 3.6.0
|
|
|
|
# https://developer.r-project.org/Blog/public/2019/02/14/staged-install/index.html
|
2020-06-17 16:29:10 +02:00
|
|
|
sapply(package, function(pkg)
|
|
|
|
tryCatch(get(".packageName", envir = asNamespace(pkg)),
|
2020-07-02 21:12:52 +02:00
|
|
|
error = function(e) {
|
2020-06-17 15:14:37 +02:00
|
|
|
if (package == "rstudioapi") {
|
|
|
|
stop("This function only works in RStudio.", call. = FALSE)
|
2020-06-17 16:29:10 +02:00
|
|
|
} else if (pkg != "base") {
|
2020-08-26 16:13:40 +02:00
|
|
|
stop("This requires the '", pkg, "' package.",
|
2020-06-17 16:29:10 +02:00
|
|
|
"\nTry to install it with: install.packages(\"", pkg, "\")",
|
2020-06-17 15:14:37 +02:00
|
|
|
call. = FALSE)
|
|
|
|
}
|
|
|
|
}))
|
2019-06-01 20:40:49 +02:00
|
|
|
return(invisible())
|
2019-03-26 14:24:03 +01:00
|
|
|
}
|
2019-05-10 16:44:59 +02:00
|
|
|
|
2020-08-10 11:44:58 +02:00
|
|
|
import_fn <- function(name, pkg, error_on_fail = TRUE) {
|
|
|
|
if (isTRUE(error_on_fail)) {
|
|
|
|
stop_ifnot_installed(pkg)
|
|
|
|
}
|
2020-07-08 14:48:06 +02:00
|
|
|
tryCatch(
|
|
|
|
get(name, envir = asNamespace(pkg)),
|
2020-08-10 11:44:58 +02:00
|
|
|
error = function(e) {
|
|
|
|
if (isTRUE(error_on_fail)) {
|
2020-10-26 12:23:03 +01:00
|
|
|
stop_("function ", name, "() not found in package '", pkg,
|
|
|
|
"'. Please create an issue at https://github.com/msberends/AMR/issues. Many thanks!",
|
2020-08-26 16:13:40 +02:00
|
|
|
call = FALSE)
|
2020-08-10 11:44:58 +02:00
|
|
|
} else {
|
|
|
|
return(NULL)
|
|
|
|
}
|
|
|
|
})
|
2020-06-17 15:14:37 +02:00
|
|
|
}
|
|
|
|
|
2020-11-10 16:35:56 +01:00
|
|
|
# this alternative wrapper to the message(), warning() and stop() functions:
|
2020-10-26 12:23:03 +01:00
|
|
|
# - wraps text to never break lines within words
|
|
|
|
# - ignores formatted text while wrapping
|
|
|
|
# - adds indentation dependent on the type of message (like NOTE)
|
2020-11-10 16:35:56 +01:00
|
|
|
# - can add additional formatting functions like blue or bold text
|
|
|
|
word_wrap <- function(...,
|
|
|
|
add_fn = list(),
|
|
|
|
as_note = FALSE,
|
|
|
|
width = 0.95 * getOption("width"),
|
|
|
|
extra_indent = 0) {
|
2020-10-26 12:23:03 +01:00
|
|
|
msg <- paste0(c(...), collapse = "")
|
2020-11-10 16:35:56 +01:00
|
|
|
# replace new lines to add them again later
|
|
|
|
msg <- gsub("\n", "*|*", msg, fixed = TRUE)
|
2020-10-26 15:53:31 +01:00
|
|
|
|
|
|
|
if (isTRUE(as_note)) {
|
2020-12-07 16:06:42 +01:00
|
|
|
msg <- paste0("NOTE: ", gsub("^note:? ?", "", msg, ignore.case = TRUE))
|
2020-10-26 15:53:31 +01:00
|
|
|
}
|
2020-11-10 16:35:56 +01:00
|
|
|
|
2020-10-26 12:23:03 +01:00
|
|
|
# we need to correct for already applied style, that adds text like "\033[31m\"
|
|
|
|
msg_stripped <- font_stripstyle(msg)
|
|
|
|
# where are the spaces now?
|
|
|
|
msg_stripped_wrapped <- paste0(strwrap(msg_stripped,
|
|
|
|
simplify = TRUE,
|
2020-11-10 16:35:56 +01:00
|
|
|
width = width),
|
|
|
|
collapse = "\n")
|
|
|
|
msg_stripped_wrapped <- paste0(unlist(strsplit(msg_stripped_wrapped, "(\n|\\*\\|\\*)")),
|
2020-10-26 12:23:03 +01:00
|
|
|
collapse = "\n")
|
|
|
|
msg_stripped_spaces <- which(unlist(strsplit(msg_stripped, "")) == " ")
|
2020-11-10 16:35:56 +01:00
|
|
|
msg_stripped_wrapped_spaces <- which(unlist(strsplit(msg_stripped_wrapped, "")) != "\n")
|
2020-10-26 12:23:03 +01:00
|
|
|
# so these are the indices of spaces that need to be replaced
|
|
|
|
replace_spaces <- which(!msg_stripped_spaces %in% msg_stripped_wrapped_spaces)
|
|
|
|
# put it together
|
|
|
|
msg <- unlist(strsplit(msg, " "))
|
|
|
|
msg[replace_spaces] <- paste0(msg[replace_spaces], "\n")
|
|
|
|
msg <- paste0(msg, collapse = " ")
|
|
|
|
msg <- gsub("\n ", "\n", msg, fixed = TRUE)
|
2020-11-10 16:35:56 +01:00
|
|
|
|
2020-10-26 12:23:03 +01:00
|
|
|
if (msg_stripped %like% "^NOTE: ") {
|
2020-11-10 16:35:56 +01:00
|
|
|
indentation <- 6 + extra_indent
|
2020-10-27 15:56:51 +01:00
|
|
|
} else if (msg_stripped %like% "^=> ") {
|
2020-11-10 16:35:56 +01:00
|
|
|
indentation <- 3 + extra_indent
|
2020-10-26 12:23:03 +01:00
|
|
|
} else {
|
2020-11-10 16:35:56 +01:00
|
|
|
indentation <- 0 + extra_indent
|
2020-10-26 12:23:03 +01:00
|
|
|
}
|
|
|
|
msg <- gsub("\n", paste0("\n", strrep(" ", indentation)), msg, fixed = TRUE)
|
2020-11-10 16:35:56 +01:00
|
|
|
msg <- gsub("*|*", paste0("*|*", strrep(" ", indentation)), msg, fixed = TRUE)
|
2020-11-10 19:59:14 +01:00
|
|
|
# remove trailing empty characters
|
|
|
|
msg <- gsub("(\n| )+$", "", msg)
|
|
|
|
|
2020-10-26 12:23:03 +01:00
|
|
|
if (length(add_fn) > 0) {
|
|
|
|
if (!is.list(add_fn)) {
|
|
|
|
add_fn <- list(add_fn)
|
|
|
|
}
|
|
|
|
for (i in seq_len(length(add_fn))) {
|
|
|
|
msg <- add_fn[[i]](msg)
|
|
|
|
}
|
|
|
|
}
|
2020-11-10 16:35:56 +01:00
|
|
|
|
|
|
|
# place back spaces
|
|
|
|
msg <- gsub("*|*", "\n", msg, fixed = TRUE)
|
2020-12-01 16:59:57 +01:00
|
|
|
|
|
|
|
# format backticks
|
|
|
|
msg <- gsub("(`.+?`)", font_grey_bg("\\1"), msg)
|
|
|
|
|
2020-11-10 16:35:56 +01:00
|
|
|
msg
|
|
|
|
}
|
|
|
|
|
|
|
|
message_ <- function(...,
|
|
|
|
appendLF = TRUE,
|
|
|
|
add_fn = list(font_blue),
|
|
|
|
as_note = TRUE) {
|
|
|
|
message(word_wrap(...,
|
|
|
|
add_fn = add_fn,
|
|
|
|
as_note = as_note),
|
|
|
|
appendLF = appendLF)
|
|
|
|
}
|
|
|
|
|
|
|
|
warning_ <- function(...,
|
|
|
|
add_fn = list(),
|
|
|
|
immediate = FALSE,
|
|
|
|
call = TRUE) {
|
|
|
|
warning(word_wrap(...,
|
|
|
|
add_fn = add_fn,
|
|
|
|
as_note = FALSE),
|
|
|
|
immediate. = immediate,
|
|
|
|
call. = call)
|
2020-10-26 12:23:03 +01:00
|
|
|
}
|
|
|
|
|
|
|
|
# this alternative to the stop() function:
|
|
|
|
# - adds the function name where the error was thrown
|
|
|
|
# - wraps text to never break lines within words
|
2020-07-01 11:07:01 +02:00
|
|
|
stop_ <- function(..., call = TRUE) {
|
2020-11-28 22:15:44 +01:00
|
|
|
msg <- paste0(c(...), collapse = "")
|
2020-07-01 11:07:01 +02:00
|
|
|
if (!isFALSE(call)) {
|
|
|
|
if (isTRUE(call)) {
|
|
|
|
call <- as.character(sys.call(-1)[1])
|
|
|
|
} else {
|
|
|
|
# so you can go back more than 1 call, as used in rsi_calc(), that now throws a reference to e.g. n_rsi()
|
|
|
|
call <- as.character(sys.call(call)[1])
|
|
|
|
}
|
|
|
|
msg <- paste0("in ", call, "(): ", msg)
|
|
|
|
}
|
2020-11-28 22:15:44 +01:00
|
|
|
msg <- word_wrap(msg, add_fn = list(), as_note = FALSE)
|
2020-07-01 11:07:01 +02:00
|
|
|
stop(msg, call. = FALSE)
|
|
|
|
}
|
|
|
|
|
2020-06-22 11:18:40 +02:00
|
|
|
stop_if <- function(expr, ..., call = TRUE) {
|
|
|
|
if (isTRUE(expr)) {
|
2020-07-01 11:07:01 +02:00
|
|
|
if (isTRUE(call)) {
|
|
|
|
call <- -1
|
|
|
|
}
|
2020-06-26 10:21:22 +02:00
|
|
|
if (!isFALSE(call)) {
|
2020-07-01 11:07:01 +02:00
|
|
|
# since we're calling stop_(), which is another call
|
|
|
|
call <- call - 1
|
2020-06-26 10:21:22 +02:00
|
|
|
}
|
2020-07-01 11:07:01 +02:00
|
|
|
stop_(..., call = call)
|
2020-03-08 11:18:59 +01:00
|
|
|
}
|
|
|
|
}
|
|
|
|
|
2020-06-22 11:18:40 +02:00
|
|
|
stop_ifnot <- function(expr, ..., call = TRUE) {
|
2020-09-24 00:30:11 +02:00
|
|
|
if (isFALSE(expr)) {
|
2020-07-01 11:07:01 +02:00
|
|
|
if (isTRUE(call)) {
|
|
|
|
call <- -1
|
|
|
|
}
|
2020-06-26 10:21:22 +02:00
|
|
|
if (!isFALSE(call)) {
|
2020-07-01 11:07:01 +02:00
|
|
|
# since we're calling stop_(), which is another call
|
|
|
|
call <- call - 1
|
2020-06-26 10:21:22 +02:00
|
|
|
}
|
2020-07-01 11:07:01 +02:00
|
|
|
stop_(..., call = call)
|
2020-06-22 11:18:40 +02:00
|
|
|
}
|
|
|
|
}
|
2020-03-08 11:18:59 +01:00
|
|
|
|
2019-05-20 19:12:41 +02:00
|
|
|
"%or%" <- function(x, y) {
|
2019-06-16 21:42:40 +02:00
|
|
|
if (is.null(x) | is.null(y)) {
|
|
|
|
if (is.null(x)) {
|
|
|
|
return(y)
|
|
|
|
} else {
|
|
|
|
return(x)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
ifelse(!is.na(x),
|
|
|
|
x,
|
|
|
|
ifelse(!is.na(y), y, NA))
|
2019-05-20 19:12:41 +02:00
|
|
|
}
|
2019-08-26 16:02:03 +02:00
|
|
|
|
|
|
|
class_integrity_check <- function(value, type, check_vector) {
|
|
|
|
if (!all(value[!is.na(value)] %in% check_vector)) {
|
2020-11-10 16:35:56 +01:00
|
|
|
warning_(paste0("invalid ", type, ", NA generated"), call = FALSE)
|
2019-08-26 16:02:03 +02:00
|
|
|
value[!value %in% check_vector] <- NA
|
|
|
|
}
|
|
|
|
value
|
|
|
|
}
|
2020-01-27 19:14:23 +01:00
|
|
|
|
|
|
|
# transforms data set to data.frame with only ASCII values, to comply with CRAN policies
|
|
|
|
dataset_UTF8_to_ASCII <- function(df) {
|
|
|
|
trans <- function(vect) {
|
|
|
|
iconv(vect, from = "UTF-8", to = "ASCII//TRANSLIT")
|
|
|
|
}
|
|
|
|
df <- as.data.frame(df, stringsAsFactors = FALSE)
|
|
|
|
for (i in seq_len(NCOL(df))) {
|
|
|
|
col <- df[, i]
|
|
|
|
if (is.list(col)) {
|
|
|
|
col <- lapply(col, function(j) trans(j))
|
|
|
|
df[, i] <- list(col)
|
|
|
|
} else {
|
|
|
|
if (is.factor(col)) {
|
|
|
|
levels(col) <- trans(levels(col))
|
|
|
|
} else if (is.character(col)) {
|
|
|
|
col <- trans(col)
|
|
|
|
} else {
|
|
|
|
col
|
|
|
|
}
|
|
|
|
df[, i] <- col
|
|
|
|
}
|
|
|
|
}
|
|
|
|
df
|
|
|
|
}
|
2020-05-16 13:05:47 +02:00
|
|
|
|
2020-11-28 22:15:44 +01:00
|
|
|
# for eucast_rules() and mdro(), creates markdown output with URLs and names
|
2020-09-24 00:30:11 +02:00
|
|
|
create_ab_documentation <- function(ab) {
|
|
|
|
ab_names <- ab_name(ab, language = NULL, tolower = TRUE)
|
|
|
|
ab <- ab[order(ab_names)]
|
|
|
|
ab_names <- ab_names[order(ab_names)]
|
|
|
|
atcs <- ab_atc(ab)
|
|
|
|
atcs[!is.na(atcs)] <- paste0("[", atcs[!is.na(atcs)], "](", ab_url(ab[!is.na(atcs)]), ")")
|
|
|
|
atcs[is.na(atcs)] <- "no ATC code"
|
|
|
|
out <- paste0(ab_names, " (`", ab, "`, ", atcs, ")", collapse = ", ")
|
|
|
|
substr(out, 1, 1) <- toupper(substr(out, 1, 1))
|
|
|
|
out
|
|
|
|
}
|
|
|
|
|
2020-10-19 17:09:19 +02:00
|
|
|
# a check for every single argument in all functions
|
|
|
|
meet_criteria <- function(object,
|
|
|
|
allow_class = NULL,
|
|
|
|
has_length = NULL,
|
|
|
|
looks_like = NULL,
|
|
|
|
is_in = NULL,
|
|
|
|
contains_column_class = NULL,
|
|
|
|
allow_NULL = FALSE,
|
|
|
|
allow_NA = FALSE,
|
|
|
|
ignore.case = FALSE,
|
|
|
|
.call_depth = 0) { # depth in calling
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-10-19 17:09:19 +02:00
|
|
|
obj_name <- deparse(substitute(object))
|
|
|
|
call_depth <- -2 - abs(.call_depth)
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-10-19 17:09:19 +02:00
|
|
|
if (is.null(object)) {
|
|
|
|
stop_if(allow_NULL == FALSE, "argument `", obj_name, "` must not be NULL", call = call_depth)
|
|
|
|
return(invisible())
|
|
|
|
}
|
|
|
|
if (is.null(dim(object)) && length(object) == 1 && is.na(object)) {
|
|
|
|
stop_if(allow_NA == FALSE, "argument `", obj_name, "` must not be NA", call = call_depth)
|
|
|
|
return(invisible())
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-10-19 17:09:19 +02:00
|
|
|
vector_or <- function(v, quotes) {
|
|
|
|
if (length(v) == 1) {
|
|
|
|
return(paste0(ifelse(quotes, '"', ""), v, ifelse(quotes, '"', "")))
|
|
|
|
}
|
|
|
|
# all commas except for last item, so will become '"val1", "val2", "val3" or "val4"'
|
|
|
|
paste0(paste0(ifelse(quotes, '"', ""), v[seq_len(length(v) - 1)], ifelse(quotes, '"', ""), collapse = ", "),
|
|
|
|
" or ", paste0(ifelse(quotes, '"', ""), v[length(v)], ifelse(quotes, '"', "")))
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-10-19 17:09:19 +02:00
|
|
|
if (!is.null(allow_class)) {
|
2020-10-26 12:23:03 +01:00
|
|
|
stop_ifnot(inherits(object, allow_class), "argument `", obj_name,
|
|
|
|
"` must ", # ifelse(allow_NULL, "be NULL or must ", ""),
|
|
|
|
"be of class ", vector_or(allow_class, quotes = TRUE),
|
2020-10-19 17:09:19 +02:00
|
|
|
", not \"", paste(class(object), collapse = "/"), "\"",
|
|
|
|
call = call_depth)
|
|
|
|
# check data.frames for data
|
|
|
|
if (inherits(object, "data.frame")) {
|
2020-10-26 12:23:03 +01:00
|
|
|
stop_if(any(dim(object) == 0),
|
2020-10-19 17:09:19 +02:00
|
|
|
"the data provided in argument `", obj_name,
|
2020-10-26 12:23:03 +01:00
|
|
|
"` must contain rows and columns (current dimensions: ",
|
2020-12-01 16:59:57 +01:00
|
|
|
paste(dim(object), collapse = "x"), ")",
|
2020-10-19 17:09:19 +02:00
|
|
|
call = call_depth)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
if (!is.null(has_length)) {
|
2020-10-26 12:23:03 +01:00
|
|
|
stop_ifnot(length(object) %in% has_length, "argument `", obj_name,
|
|
|
|
"` must ", # ifelse(allow_NULL, "be NULL or must ", ""),
|
2020-10-19 17:09:19 +02:00
|
|
|
"be of length ", vector_or(has_length, quotes = FALSE),
|
|
|
|
", not ", length(object),
|
|
|
|
call = call_depth)
|
|
|
|
}
|
|
|
|
if (!is.null(looks_like)) {
|
2020-10-26 12:23:03 +01:00
|
|
|
stop_ifnot(object %like% looks_like, "argument `", obj_name,
|
|
|
|
"` must ", # ifelse(allow_NULL, "be NULL or must ", ""),
|
2020-10-19 17:09:19 +02:00
|
|
|
"resemble the regular expression \"", looks_like, "\"",
|
|
|
|
call = call_depth)
|
|
|
|
}
|
|
|
|
if (!is.null(is_in)) {
|
|
|
|
if (ignore.case == TRUE) {
|
|
|
|
object <- tolower(object)
|
|
|
|
is_in <- tolower(is_in)
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
stop_ifnot(all(object %in% is_in, na.rm = TRUE), "argument `", obj_name,
|
2020-10-19 17:09:19 +02:00
|
|
|
"` must be ",
|
|
|
|
ifelse(!is.null(has_length) && length(has_length) == 1 && has_length == 1, "one of: ", ""),
|
2020-10-26 12:23:03 +01:00
|
|
|
vector_or(is_in, quotes = TRUE),
|
2020-10-19 17:09:19 +02:00
|
|
|
", not ", paste0("\"", object, "\"", collapse = "/"), "",
|
|
|
|
call = call_depth)
|
|
|
|
}
|
|
|
|
if (!is.null(contains_column_class)) {
|
|
|
|
stop_ifnot(any(sapply(object, function(col, columns_class = contains_column_class) inherits(col, columns_class)), na.rm = TRUE),
|
2020-10-26 12:23:03 +01:00
|
|
|
"the data provided in argument `", obj_name,
|
2020-10-19 17:09:19 +02:00
|
|
|
"` must contain at least one column of class <", contains_column_class, ">. ",
|
|
|
|
"See ?as.", contains_column_class, ".",
|
|
|
|
call = call_depth)
|
|
|
|
}
|
|
|
|
return(invisible())
|
|
|
|
}
|
|
|
|
|
2020-12-07 16:06:42 +01:00
|
|
|
get_current_data <- function(arg_name, call) {
|
|
|
|
# this mimics dplyr::cur_data_all for users that use our content-aware functions in dplyr verbs
|
|
|
|
cur_data_all_dplyr <- import_fn("cur_data_all", "dplyr", error_on_fail = FALSE)
|
|
|
|
if (is.null(cur_data_all_dplyr)) {
|
|
|
|
# dplyr not installed
|
|
|
|
stop_("argument `", arg_name, "` is missing, with no default", call = call)
|
|
|
|
}
|
|
|
|
tryCatch(cur_data_all_dplyr(),
|
|
|
|
# dplyr installed, but not used inside dplyr verb
|
|
|
|
error = function(e) stop_("argument `", arg_name, "` is missing with no default ",
|
|
|
|
"or function not used inside a valid dplyr verb",
|
|
|
|
# tryCatch adds 4 system calls, subtract them
|
|
|
|
call = call - 4))
|
|
|
|
}
|
|
|
|
|
2020-06-17 15:14:37 +02:00
|
|
|
has_colour <- function() {
|
2020-06-05 13:56:05 +02:00
|
|
|
# this is a base R version of crayon::has_color
|
|
|
|
enabled <- getOption("crayon.enabled")
|
|
|
|
if (!is.null(enabled)) {
|
|
|
|
return(isTRUE(enabled))
|
|
|
|
}
|
|
|
|
rstudio_with_ansi_support <- function(x) {
|
|
|
|
if (Sys.getenv("RSTUDIO", "") == "") {
|
|
|
|
return(FALSE)
|
|
|
|
}
|
|
|
|
if ((cols <- Sys.getenv("RSTUDIO_CONSOLE_COLOR", "")) != "" && !is.na(as.numeric(cols))) {
|
|
|
|
return(TRUE)
|
|
|
|
}
|
|
|
|
tryCatch(get("isAvailable", envir = asNamespace("rstudioapi"))(), error = function(e) return(FALSE)) &&
|
|
|
|
tryCatch(get("hasFun", envir = asNamespace("rstudioapi"))("getConsoleHasColor"), error = function(e) return(FALSE))
|
|
|
|
}
|
|
|
|
if (rstudio_with_ansi_support() && sink.number() == 0) {
|
|
|
|
return(TRUE)
|
|
|
|
}
|
|
|
|
if (!isatty(stdout())) {
|
2020-05-16 13:05:47 +02:00
|
|
|
return(FALSE)
|
|
|
|
}
|
|
|
|
if (tolower(Sys.info()["sysname"]) == "windows") {
|
2020-06-05 13:56:05 +02:00
|
|
|
if (Sys.getenv("ConEmuANSI") == "ON") {
|
2020-05-16 13:05:47 +02:00
|
|
|
return(TRUE)
|
|
|
|
}
|
2020-06-05 13:56:05 +02:00
|
|
|
if (Sys.getenv("CMDER_ROOT") != "") {
|
|
|
|
return(TRUE)
|
|
|
|
}
|
|
|
|
return(FALSE)
|
|
|
|
}
|
2020-06-17 15:14:37 +02:00
|
|
|
emacs_version <- function() {
|
2020-06-05 13:56:05 +02:00
|
|
|
ver <- Sys.getenv("INSIDE_EMACS")
|
|
|
|
if (ver == "") {
|
|
|
|
return(NA_integer_)
|
|
|
|
}
|
|
|
|
ver <- gsub("'", "", ver)
|
|
|
|
ver <- strsplit(ver, ",", fixed = TRUE)[[1]]
|
|
|
|
ver <- strsplit(ver, ".", fixed = TRUE)[[1]]
|
|
|
|
as.numeric(ver)
|
2020-05-16 13:05:47 +02:00
|
|
|
}
|
2020-06-05 13:56:05 +02:00
|
|
|
if ((Sys.getenv("EMACS") != "" || Sys.getenv("INSIDE_EMACS") != "") &&
|
|
|
|
!is.na(emacs_version()[1]) && emacs_version()[1] >= 23) {
|
|
|
|
return(TRUE)
|
|
|
|
}
|
|
|
|
if ("COLORTERM" %in% names(Sys.getenv())) {
|
|
|
|
return(TRUE)
|
|
|
|
}
|
|
|
|
if (Sys.getenv("TERM") == "dumb") {
|
|
|
|
return(FALSE)
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
grepl(pattern = "^screen|^xterm|^vt100|color|ansi|cygwin|linux",
|
2020-06-05 13:56:05 +02:00
|
|
|
x = Sys.getenv("TERM"),
|
|
|
|
ignore.case = TRUE,
|
|
|
|
perl = TRUE)
|
2020-05-16 13:05:47 +02:00
|
|
|
}
|
|
|
|
|
2020-12-07 16:06:42 +01:00
|
|
|
# set colours if console has_colour()
|
2020-05-16 13:05:47 +02:00
|
|
|
try_colour <- function(..., before, after, collapse = " ") {
|
|
|
|
txt <- paste0(unlist(list(...)), collapse = collapse)
|
|
|
|
if (isTRUE(has_colour())) {
|
|
|
|
if (is.null(collapse)) {
|
|
|
|
paste0(before, txt, after, collapse = NULL)
|
|
|
|
} else {
|
|
|
|
paste0(before, txt, after, collapse = "")
|
|
|
|
}
|
|
|
|
} else {
|
|
|
|
txt
|
|
|
|
}
|
|
|
|
}
|
|
|
|
font_black <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[38;5;232m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_blue <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[34m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_green <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[32m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_magenta <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[35m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_red <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[31m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_silver <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[90m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_white <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[37m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_yellow <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[33m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_subtle <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[38;5;246m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_grey <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[38;5;249m", after = "\033[39m", collapse = collapse)
|
|
|
|
}
|
2020-12-01 16:59:57 +01:00
|
|
|
font_grey_bg <- function(..., collapse = " ") {
|
2020-12-07 16:06:42 +01:00
|
|
|
try_colour(..., before = "\033[48;5;255m", after = "\033[49m", collapse = collapse)
|
2020-12-01 16:59:57 +01:00
|
|
|
}
|
2020-05-16 13:05:47 +02:00
|
|
|
font_green_bg <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[42m", after = "\033[49m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_red_bg <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[41m", after = "\033[49m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_yellow_bg <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[43m", after = "\033[49m", collapse = collapse)
|
|
|
|
}
|
2020-08-28 21:55:47 +02:00
|
|
|
font_na <- function(..., collapse = " ") {
|
|
|
|
font_red(..., collapse = collapse)
|
|
|
|
}
|
2020-05-16 13:05:47 +02:00
|
|
|
font_bold <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[1m", after = "\033[22m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_italic <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[3m", after = "\033[23m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_underline <- function(..., collapse = " ") {
|
|
|
|
try_colour(..., before = "\033[4m", after = "\033[24m", collapse = collapse)
|
|
|
|
}
|
|
|
|
font_stripstyle <- function(x) {
|
|
|
|
# from crayon:::ansi_regex
|
|
|
|
gsub("(?:(?:\\x{001b}\\[)|\\x{009b})(?:(?:[0-9]{1,3})?(?:(?:;[0-9]{0,3})*)?[A-M|f-m])|\\x{001b}[A-M]", "", x, perl = TRUE)
|
|
|
|
}
|
|
|
|
|
2020-09-18 16:05:53 +02:00
|
|
|
progress_ticker <- function(n = 1, n_min = 0, ...) {
|
2020-07-29 10:33:47 +02:00
|
|
|
if (!interactive() || n < n_min) {
|
2020-05-16 13:05:47 +02:00
|
|
|
pb <- list()
|
|
|
|
pb$tick <- function() {
|
|
|
|
invisible()
|
|
|
|
}
|
|
|
|
pb$kill <- function() {
|
|
|
|
invisible()
|
|
|
|
}
|
2020-11-16 16:57:55 +01:00
|
|
|
set_clean_class(pb, new_class = "txtProgressBar")
|
2020-07-29 10:33:47 +02:00
|
|
|
} else if (n >= n_min) {
|
|
|
|
pb <- utils::txtProgressBar(max = n, style = 3)
|
|
|
|
pb$tick <- function() {
|
|
|
|
pb$up(pb$getVal() + 1)
|
|
|
|
}
|
|
|
|
pb
|
2020-05-16 13:05:47 +02:00
|
|
|
}
|
|
|
|
}
|
|
|
|
|
2020-11-16 16:57:55 +01:00
|
|
|
set_clean_class <- function(x, new_class) {
|
2020-12-07 16:06:42 +01:00
|
|
|
# return the object with only the new class and no additional attributes where possible
|
2020-11-16 16:57:55 +01:00
|
|
|
if (is.null(x)) {
|
|
|
|
x <- NA_character_
|
|
|
|
}
|
|
|
|
if (is.factor(x)) {
|
2020-12-07 16:06:42 +01:00
|
|
|
# keep only levels and remove all other attributes
|
2020-11-16 16:57:55 +01:00
|
|
|
lvls <- levels(x)
|
|
|
|
attributes(x) <- NULL
|
|
|
|
levels(x) <- lvls
|
2020-11-16 20:02:20 +01:00
|
|
|
} else if (!is.list(x) && !is.function(x)) {
|
2020-11-16 16:57:55 +01:00
|
|
|
attributes(x) <- NULL
|
|
|
|
}
|
|
|
|
class(x) <- new_class
|
|
|
|
x
|
|
|
|
}
|
|
|
|
|
2020-08-28 21:55:47 +02:00
|
|
|
create_pillar_column <- function(x, ...) {
|
|
|
|
new_pillar_shaft_simple <- import_fn("new_pillar_shaft_simple", "pillar", error_on_fail = FALSE)
|
|
|
|
if (!is.null(new_pillar_shaft_simple)) {
|
2020-10-26 12:23:03 +01:00
|
|
|
new_pillar_shaft_simple(x, ...)
|
2020-08-28 21:55:47 +02:00
|
|
|
} else {
|
|
|
|
# does not exist in package 'pillar' anymore
|
|
|
|
structure(list(x),
|
|
|
|
class = "pillar_shaft_simple",
|
|
|
|
...)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
2020-09-12 08:49:01 +02:00
|
|
|
# copied from vctrs::s3_register by their permission:
|
|
|
|
# https://github.com/r-lib/vctrs/blob/05968ce8e669f73213e3e894b5f4424af4f46316/R/register-s3.R
|
2020-08-28 21:55:47 +02:00
|
|
|
s3_register <- function(generic, class, method = NULL) {
|
|
|
|
stopifnot(is.character(generic), length(generic) == 1)
|
|
|
|
stopifnot(is.character(class), length(class) == 1)
|
|
|
|
pieces <- strsplit(generic, "::")[[1]]
|
|
|
|
stopifnot(length(pieces) == 2)
|
|
|
|
package <- pieces[[1]]
|
|
|
|
generic <- pieces[[2]]
|
|
|
|
caller <- parent.frame()
|
|
|
|
get_method_env <- function() {
|
|
|
|
top <- topenv(caller)
|
|
|
|
if (isNamespace(top)) {
|
|
|
|
asNamespace(environmentName(top))
|
|
|
|
}
|
|
|
|
else {
|
|
|
|
caller
|
|
|
|
}
|
|
|
|
}
|
|
|
|
get_method <- function(method, env) {
|
|
|
|
if (is.null(method)) {
|
|
|
|
get(paste0(generic, ".", class), envir = get_method_env())
|
|
|
|
}
|
|
|
|
else {
|
|
|
|
method
|
|
|
|
}
|
|
|
|
}
|
|
|
|
method_fn <- get_method(method)
|
|
|
|
stopifnot(is.function(method_fn))
|
|
|
|
setHook(packageEvent(package, "onLoad"), function(...) {
|
|
|
|
ns <- asNamespace(package)
|
|
|
|
method_fn <- get_method(method)
|
|
|
|
registerS3method(generic, class, method_fn, envir = ns)
|
|
|
|
})
|
|
|
|
if (!isNamespaceLoaded(package)) {
|
|
|
|
return(invisible())
|
|
|
|
}
|
|
|
|
envir <- asNamespace(package)
|
|
|
|
if (exists(generic, envir)) {
|
|
|
|
registerS3method(generic, class, method_fn, envir = envir)
|
|
|
|
}
|
|
|
|
invisible()
|
|
|
|
}
|
|
|
|
|
2020-06-22 11:18:40 +02:00
|
|
|
# works exactly like round(), but rounds `round2(44.55, 1)` to 44.6 instead of 44.5
|
2020-05-16 13:05:47 +02:00
|
|
|
# and adds decimal zeroes until `digits` is reached when force_zero = TRUE
|
|
|
|
round2 <- function(x, digits = 0, force_zero = TRUE) {
|
|
|
|
x <- as.double(x)
|
|
|
|
# https://stackoverflow.com/a/12688836/4575331
|
|
|
|
val <- (trunc((abs(x) * 10 ^ digits) + 0.5) / 10 ^ digits) * sign(x)
|
|
|
|
if (digits > 0 & force_zero == TRUE) {
|
|
|
|
values_trans <- val[val != as.integer(val) & !is.na(val)]
|
|
|
|
val[val != as.integer(val) & !is.na(val)] <- paste0(values_trans,
|
2020-10-26 12:23:03 +01:00
|
|
|
strrep("0",
|
|
|
|
max(0,
|
2020-05-16 13:05:47 +02:00
|
|
|
digits - nchar(
|
|
|
|
format(
|
|
|
|
as.double(
|
2020-10-26 12:23:03 +01:00
|
|
|
gsub(".*[.](.*)$",
|
2020-05-16 13:05:47 +02:00
|
|
|
"\\1",
|
|
|
|
values_trans)),
|
|
|
|
scientific = FALSE)))))
|
|
|
|
}
|
|
|
|
as.double(val)
|
|
|
|
}
|
|
|
|
|
|
|
|
|
|
|
|
# percentage from our other package: 'cleaner'
|
|
|
|
percentage <- function(x, digits = NULL, ...) {
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-05-16 13:05:47 +02:00
|
|
|
# getdecimalplaces() function
|
|
|
|
getdecimalplaces <- function(x, minimum = 0, maximum = 3) {
|
|
|
|
if (maximum < minimum) {
|
|
|
|
maximum <- minimum
|
|
|
|
}
|
|
|
|
if (minimum > maximum) {
|
|
|
|
minimum <- maximum
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
max_places <- max(unlist(lapply(strsplit(sub("0+$", "",
|
2020-05-16 13:05:47 +02:00
|
|
|
as.character(x * 100)), ".", fixed = TRUE),
|
|
|
|
function(y) ifelse(length(y) == 2, nchar(y[2]), 0))), na.rm = TRUE)
|
|
|
|
max(min(max_places,
|
|
|
|
maximum, na.rm = TRUE),
|
|
|
|
minimum, na.rm = TRUE)
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-05-16 13:05:47 +02:00
|
|
|
# format_percentage() function
|
|
|
|
format_percentage <- function(x, digits = NULL, ...) {
|
|
|
|
if (is.null(digits)) {
|
|
|
|
digits <- getdecimalplaces(x)
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-05-16 13:05:47 +02:00
|
|
|
# round right: percentage(0.4455) and format(as.percentage(0.4455), 1) should return "44.6%", not "44.5%"
|
|
|
|
x_formatted <- format(round2(as.double(x), digits = digits + 2) * 100,
|
|
|
|
scientific = FALSE,
|
|
|
|
digits = digits,
|
|
|
|
nsmall = digits,
|
|
|
|
...)
|
|
|
|
x_formatted <- paste0(x_formatted, "%")
|
|
|
|
x_formatted[!grepl(pattern = "^[0-9.,e-]+$", x = x)] <- NA_character_
|
|
|
|
x_formatted
|
|
|
|
}
|
2020-10-26 12:23:03 +01:00
|
|
|
|
2020-05-16 13:05:47 +02:00
|
|
|
# the actual working part
|
|
|
|
x <- as.double(x)
|
|
|
|
if (is.null(digits)) {
|
|
|
|
# max one digit if undefined
|
|
|
|
digits <- getdecimalplaces(x, minimum = 0, maximum = 1)
|
|
|
|
}
|
|
|
|
format_percentage(structure(.Data = as.double(x),
|
|
|
|
class = c("percentage", "numeric")),
|
|
|
|
digits = digits, ...)
|
|
|
|
}
|
2020-05-18 13:59:34 +02:00
|
|
|
|
|
|
|
# prevent dependency on package 'backports'
|
2020-09-03 12:31:48 +02:00
|
|
|
# these functions were not available in previous versions of R (last checked: R 4.0.2)
|
2020-05-19 12:08:49 +02:00
|
|
|
# see here for the full list: https://github.com/r-lib/backports
|
2020-05-19 13:18:01 +02:00
|
|
|
strrep <- function(x, times) {
|
|
|
|
x <- as.character(x)
|
2020-10-26 12:23:03 +01:00
|
|
|
if (length(x) == 0L)
|
2020-05-18 13:59:34 +02:00
|
|
|
return(x)
|
|
|
|
unlist(.mapply(function(x, times) {
|
2020-10-26 12:23:03 +01:00
|
|
|
if (is.na(x) || is.na(times))
|
2020-05-18 13:59:34 +02:00
|
|
|
return(NA_character_)
|
2020-10-26 12:23:03 +01:00
|
|
|
if (times <= 0L)
|
2020-05-18 13:59:34 +02:00
|
|
|
return("")
|
|
|
|
paste0(replicate(times, x), collapse = "")
|
|
|
|
}, list(x = x, times = times), MoreArgs = list()), use.names = FALSE)
|
|
|
|
}
|
2020-05-19 13:18:01 +02:00
|
|
|
trimws <- function(x, which = c("both", "left", "right")) {
|
|
|
|
which <- match.arg(which)
|
|
|
|
mysub <- function(re, x) sub(re, "", x, perl = TRUE)
|
2020-10-26 12:23:03 +01:00
|
|
|
if (which == "left")
|
2020-05-18 13:59:34 +02:00
|
|
|
return(mysub("^[ \t\r\n]+", x))
|
2020-10-26 12:23:03 +01:00
|
|
|
if (which == "right")
|
2020-05-18 13:59:34 +02:00
|
|
|
return(mysub("[ \t\r\n]+$", x))
|
|
|
|
mysub("[ \t\r\n]+$", mysub("^[ \t\r\n]+", x))
|
|
|
|
}
|
2020-05-19 13:18:01 +02:00
|
|
|
isFALSE <- function(x) {
|
2020-05-18 13:59:34 +02:00
|
|
|
is.logical(x) && length(x) == 1L && !is.na(x) && !x
|
|
|
|
}
|
2020-05-19 13:18:01 +02:00
|
|
|
deparse1 <- function(expr, collapse = " ", width.cutoff = 500L, ...) {
|
2020-05-19 12:08:49 +02:00
|
|
|
paste(deparse(expr, width.cutoff, ...), collapse = collapse)
|
|
|
|
}
|
2020-08-26 15:34:12 +02:00
|
|
|
file.size <- function(...) {
|
2020-09-03 12:31:48 +02:00
|
|
|
file.info(...)$size
|
2020-08-16 21:38:42 +02:00
|
|
|
}
|
2020-08-26 15:34:12 +02:00
|
|
|
file.mtime <- function(...) {
|
2020-09-03 12:31:48 +02:00
|
|
|
file.info(...)$mtime
|
|
|
|
}
|
|
|
|
str2lang <- function(s) {
|
|
|
|
stopifnot(length(s) == 1L)
|
2020-09-14 12:21:23 +02:00
|
|
|
ex <- parse(text = s, keep.source = FALSE)
|
2020-09-03 12:31:48 +02:00
|
|
|
stopifnot(length(ex) == 1L)
|
|
|
|
ex[[1L]]
|
2020-08-16 21:38:42 +02:00
|
|
|
}
|
2020-10-08 11:16:03 +02:00
|
|
|
isNamespaceLoaded <- function(pkg) {
|
|
|
|
pkg %in% loadedNamespaces()
|
|
|
|
}
|