AMR/R/rsi_calc.R

289 lines
11 KiB
R
Raw Normal View History

2018-08-23 00:40:36 +02:00
# ==================================================================== #
# TITLE #
# Antimicrobial Resistance (AMR) Analysis #
# #
2019-01-02 23:24:07 +01:00
# SOURCE #
# https://gitlab.com/msberends/AMR #
2018-08-23 00:40:36 +02:00
# #
# LICENCE #
# (c) 2018-2020 Berends MS, Luz CF et al. #
2018-08-23 00:40:36 +02: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. #
# #
# 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. #
2019-04-05 18:47:39 +02:00
# Visit our website for more info: https://msberends.gitlab.io/AMR. #
2018-08-23 00:40:36 +02:00
# ==================================================================== #
2019-06-27 11:57:45 +02:00
dots2vars <- function(...) {
2019-08-20 11:40:54 +02:00
# this function is to give more informative output about
# variable names in count_* and proportion_* functions
2020-05-16 13:05:47 +02:00
dots <- substitute(list(...))
paste(as.character(dots)[2:length(dots)], collapse = ", ")
2019-06-27 11:57:45 +02:00
}
2018-08-23 00:40:36 +02:00
rsi_calc <- function(...,
ab_result,
minimum = 0,
as_percent = FALSE,
only_all_tested = FALSE,
only_count = FALSE) {
2019-06-27 11:57:45 +02:00
data_vars <- dots2vars(...)
2018-08-23 00:40:36 +02:00
if (!is.numeric(minimum)) {
2019-10-11 17:21:02 +02:00
stop("`minimum` must be numeric", call. = FALSE)
2018-08-23 00:40:36 +02:00
}
if (!is.logical(as_percent)) {
2019-10-11 17:21:02 +02:00
stop("`as_percent` must be logical", call. = FALSE)
2018-08-23 00:40:36 +02:00
}
if (!is.logical(only_all_tested)) {
2019-10-11 17:21:02 +02:00
stop("`only_all_tested` must be logical", call. = FALSE)
}
dots_df <- ...elt(1) # it needs this evaluation
dots <- base::eval(base::substitute(base::alist(...)))
if ("also_single_tested" %in% names(dots)) {
stop("`also_single_tested` was replaced by `only_all_tested`. Please read Details in the help page (`?proportion`) as this may have a considerable impact on your analysis.", call. = FALSE)
}
ndots <- length(dots)
if ("data.frame" %in% class(dots_df)) {
# data.frame passed with other columns, like: example_isolates %>% proportion_S(amcl, gent)
dots <- as.character(dots)
dots <- dots[dots != "."]
if (length(dots) == 0 | all(dots == "df")) {
# for complete data.frames, like example_isolates %>% select(amcl, gent) %>% proportion_S()
2020-05-16 13:05:47 +02:00
# and the old rsi function, which has "df" as name of the first parameter
x <- dots_df
} else {
2020-05-16 13:05:47 +02:00
x <- dots_df[, dots[dots %in% colnames(dots_df)]]
2018-08-23 00:40:36 +02:00
}
} else if (ndots == 1) {
# only 1 variable passed (can also be data.frame), like: proportion_S(example_isolates$amcl) and example_isolates$amcl %>% proportion_S()
x <- dots_df
2018-08-23 00:40:36 +02:00
} else {
# multiple variables passed without pipe, like: proportion_S(example_isolates$amcl, example_isolates$gent)
x <- NULL
try(x <- as.data.frame(dots), silent = TRUE)
if (is.null(x)) {
2020-05-16 13:05:47 +02:00
# support for example_isolates %>% group_by(hospital_id) %>% summarise(amox = susceptibility(GEN, AMX))
x <- as.data.frame(list(...))
}
2018-08-23 00:40:36 +02:00
}
2019-05-10 16:44:59 +02:00
if (is.null(x)) {
warning("argument is NULL (check if columns exist): returning NA", call. = FALSE)
return(NA)
}
2018-08-23 00:40:36 +02:00
print_warning <- FALSE
ab_result <- as.rsi(ab_result)
2018-08-23 00:40:36 +02:00
if (is.data.frame(x)) {
rsi_integrity_check <- character(0)
2019-10-11 17:21:02 +02:00
for (i in seq_len(ncol(x))) {
# check integrity of columns: force rsi class
2018-08-23 00:40:36 +02:00
if (!is.rsi(x %>% pull(i))) {
rsi_integrity_check <- c(rsi_integrity_check, x %>% pull(i) %>% as.character())
x[, i] <- suppressWarnings(x %>% pull(i) %>% as.rsi()) # warning will be given later
2018-08-23 00:40:36 +02:00
print_warning <- TRUE
}
}
if (length(rsi_integrity_check) > 0) {
# this will give a warning for invalid results, of all input columns (so only 1 warning)
rsi_integrity_check <- as.rsi(rsi_integrity_check)
}
2020-05-16 13:05:47 +02:00
if (only_all_tested == TRUE) {
# THE NUMBER OF ISOLATES WHERE *ALL* ABx ARE S/I/R
x <- apply(X = x %>% mutate_all(as.integer),
MARGIN = 1,
FUN = base::min)
numerator <- sum(as.integer(x) %in% as.integer(ab_result), na.rm = TRUE)
denominator <- length(x) - sum(is.na(x))
2019-10-11 17:21:02 +02:00
} else {
# THE NUMBER OF ISOLATES WHERE *ANY* ABx IS S/I/R
other_values <- base::setdiff(c(NA, levels(ab_result)), ab_result)
2019-10-11 17:21:02 +02:00
other_values_filter <- base::apply(x, 1, function(y) {
base::all(y %in% other_values) & base::any(is.na(y))
})
2020-05-16 13:05:47 +02:00
numerator <- sum(as.logical(by(x, seq_len(nrow(x)), function(row) any(unlist(row) %in% ab_result, na.rm = TRUE))))
denominator <- nrow(x[!other_values_filter, ])
}
2018-08-23 00:40:36 +02:00
} else {
# x is not a data.frame
2018-08-23 00:40:36 +02:00
if (!is.rsi(x)) {
x <- as.rsi(x)
print_warning <- TRUE
}
numerator <- sum(x %in% ab_result, na.rm = TRUE)
denominator <- sum(x %in% levels(ab_result), na.rm = TRUE)
2018-08-23 00:40:36 +02:00
}
2018-08-23 00:40:36 +02:00
if (print_warning == TRUE) {
warning("Increase speed by transforming to class `rsi` on beforehand: df %>% mutate_if(is.rsi.eligible, as.rsi)",
call. = FALSE)
}
2018-08-23 00:40:36 +02:00
if (only_count == TRUE) {
return(numerator)
2018-08-23 00:40:36 +02:00
}
if (denominator < minimum) {
if (data_vars != "") {
data_vars <- paste(" for", data_vars)
}
2019-08-20 11:40:54 +02:00
warning("Introducing NA: only ", denominator, " results available", data_vars, " (`minimum` was set to ", minimum, ").", call. = FALSE)
fraction <- NA
2018-10-12 16:35:18 +02:00
} else {
fraction <- numerator / denominator
2018-08-23 00:40:36 +02:00
}
2018-08-23 00:40:36 +02:00
if (as_percent == TRUE) {
percentage(fraction, digits = 1)
2018-08-23 00:40:36 +02:00
} else {
fraction
2018-08-23 00:40:36 +02:00
}
}
2019-05-13 10:10:16 +02:00
2020-05-16 13:05:47 +02:00
rsi_calc_df <- function(type, # "proportion", "count" or "both"
2019-05-13 10:10:16 +02:00
data,
translate_ab = "name",
language = get_locale(),
minimum = 30,
as_percent = FALSE,
combine_SI = TRUE,
combine_IR = FALSE,
combine_SI_missing = FALSE) {
2020-02-14 19:54:13 +01:00
check_dataset_integrity()
2019-05-13 10:10:16 +02:00
if (!"data.frame" %in% class(data)) {
stop(paste0("`", type, "_df` must be called on a data.frame"), call. = FALSE)
}
2019-05-13 10:10:16 +02:00
if (isTRUE(combine_IR) & isTRUE(combine_SI_missing)) {
combine_SI <- FALSE
}
if (isTRUE(combine_SI) & isTRUE(combine_IR)) {
2019-08-25 22:53:22 +02:00
stop("either `combine_SI` or `combine_IR` can be TRUE, not both", call. = FALSE)
2019-05-13 10:10:16 +02:00
}
2019-08-25 22:53:22 +02:00
if (!any(sapply(data, is.rsi), na.rm = TRUE)) {
2019-05-13 10:10:16 +02:00
stop("No columns with class 'rsi' found. See ?as.rsi.", call. = FALSE)
}
2019-05-13 10:10:16 +02:00
if (as.character(translate_ab) %in% c("TRUE", "official")) {
translate_ab <- "name"
}
2020-05-16 13:05:47 +02:00
# select only groups and antibiotics
if (has_groups(data)) {
data_has_groups <- TRUE
groups <- setdiff(names(get_groups(data)), ".rows") # get_groups is from poorman.R
data <- data[, c(groups, colnames(data)[sapply(data, is.rsi)]), drop = FALSE]
} else {
data_has_groups <- FALSE
data <- data[, colnames(data)[sapply(data, is.rsi)], drop = FALSE]
}
2020-05-16 13:05:47 +02:00
data <- as.data.frame(data, stringsAsFactors = FALSE)
if (isTRUE(combine_SI) | isTRUE(combine_IR)) {
for (i in seq_len(ncol(data))) {
if (is.rsi(data[, i, drop = TRUE])) {
data[, i] <- as.character(data[, i, drop = TRUE])
if (isTRUE(combine_SI)) {
data[, i] <- gsub("(I|S)", "SI", data[, i, drop = TRUE])
} else if (isTRUE(combine_IR)) {
data[, i] <- gsub("(I|R)", "IR", data[, i, drop = TRUE])
}
}
2020-05-16 13:05:47 +02:00
}
2019-05-13 10:10:16 +02:00
}
2020-05-16 13:05:47 +02:00
sum_it <- function(.data) {
out <- data.frame(antibiotic = character(0),
interpretation = character(0),
value = double(0),
isolates <- integer(0),
stringsAsFactors = FALSE)
if (data_has_groups) {
group_values <- unique(.data[, which(colnames(.data) %in% groups), drop = FALSE])
rownames(group_values) <- NULL
.data <- .data[, which(!colnames(.data) %in% groups), drop = FALSE]
}
for (i in seq_len(ncol(.data))) {
col_results <- as.data.frame(as.matrix(table(.data[, i, drop = TRUE])))
col_results$interpretation <- rownames(col_results)
col_results$isolates <- col_results[, 1, drop = TRUE]
if (nrow(col_results) > 0) {
if (sum(col_results$isolates, na.rm = TRUE) >= minimum) {
col_results$value <- col_results$isolates / sum(col_results$isolates, na.rm = TRUE)
} else {
col_results$value <- rep(NA_real_, NROW(col_results))
}
out_new <- data.frame(antibiotic = ab_property(colnames(.data)[i], property = translate_ab, language = language),
interpretation = col_results$interpretation,
value = col_results$value,
isolates = col_results$isolates,
stringsAsFactors = FALSE)
if (data_has_groups) {
out_new <- cbind(group_values, out_new)
}
out <- rbind(out, out_new)
}
}
out
}
2020-05-16 13:05:47 +02:00
# support dplyr groups
apply_group <- function(.data, fn, groups, ...) {
grouped <- split(x = .data, f = lapply(groups, function(x, .data) as.factor(.data[, x]), .data))
res <- do.call(rbind, unname(lapply(grouped, fn, ...)))
if (any(groups %in% colnames(res))) {
class(res) <- c("grouped_data", class(res))
attr(res, "groups") <- groups[groups %in% colnames(res)]
}
res
2019-05-13 10:10:16 +02:00
}
2020-05-16 13:05:47 +02:00
if (data_has_groups) {
out <- apply_group(data, "sum_it", groups)
} else {
out <- sum_it(data)
}
2020-05-16 13:05:47 +02:00
# apply factors for right sorting in interpretation
if (isTRUE(combine_SI)) {
out$interpretation <- factor(out$interpretation, levels = c("SI", "R"), ordered = TRUE)
} else if (isTRUE(combine_IR)) {
out$interpretation <- factor(out$interpretation, levels = c("S", "IR"), ordered = TRUE)
} else {
out$interpretation <- as.rsi(out$interpretation)
2019-05-13 10:10:16 +02:00
}
2020-05-16 13:05:47 +02:00
if (data_has_groups) {
# ordering by the groups and two more: "antibiotic" and "interpretation"
out <- out[do.call("order", out[, seq_len(length(groups) + 2)]), ]
} else {
out <- out[order(out$antibiotic, out$interpretation), ]
}
if (type == "proportion") {
out <- subset(out, select = -c(isolates))
} else if (type == "count") {
out$value <- out$isolates
out <- subset(out, select = -c(isolates))
}
rownames(out) <- NULL
out
2019-05-13 10:10:16 +02:00
}