1
0
mirror of https://github.com/msberends/AMR.git synced 2025-07-08 13:21:50 +02:00

(v1.1.0.9012) lose dependencies

This commit is contained in:
2020-05-19 12:08:49 +02:00
parent 218fd08097
commit 19703eb5d3
40 changed files with 101 additions and 584 deletions

View File

@ -53,9 +53,7 @@
#' as.rsi(df)
#' }
as.disk <- function(x, na.rm = FALSE) {
if (is.disk(x)) {
x
} else {
if (!is.disk(x)) {
x <- x %>% unlist()
if (na.rm == TRUE) {
x <- x[!is.na(x)]
@ -81,10 +79,9 @@ as.disk <- function(x, na.rm = FALSE) {
"%) that were invalid disk zones: ",
list_missing, call. = FALSE)
}
class(x) <- "disk"
x
}
structure(as.integer(x),
class = c("disk", "integer"))
}
all_valid_disks <- function(x) {
@ -98,20 +95,6 @@ is.disk <- function(x) {
inherits(x, "disk")
}
#' @exportMethod as.data.frame.disk
#' @export
#' @noRd
as.data.frame.disk <- function(x, ...) {
# same as as.data.frame.integer but with removed stringsAsFactors, since it will be class "disk"
nm <- paste(deparse(substitute(x), width.cutoff = 500L),
collapse = " ")
if (!"nm" %in% names(list(...))) {
as.data.frame.vector(x, ..., nm = nm)
} else {
as.data.frame.vector(x, ...)
}
}
#' @exportMethod print.disk
#' @export
#' @noRd
@ -120,14 +103,6 @@ print.disk <- function(x, ...) {
print(as.integer(x), quote = FALSE)
}
#' @importFrom pillar pillar_shaft
#' @export
pillar_shaft.disk <- function(x, ...) {
out <- trimws(format(x))
out[is.na(x)] <- font_red(NA)
pillar::new_pillar_shaft_simple(out, align = "right", min_width = 3)
}
#' @exportMethod [.disk
#' @export
#' @noRd