R/attach.R

Defines functions package_version erikmisc_attach same_library core_unloaded

Documented in erikmisc_attach package_version

# Based on attach.R from the tidyverse package; https://github.com/tidyverse/tidyverse/blob/main/R/attach.R

core <-
  c(
    "tibble"
  , "dplyr"
  #, "tidyr"
  #, "ggplot2"
  #, "car"
  )

core_unloaded <- function() {
  search <- paste0("package:", core)
  core[!search %in% search()]
}

# Attach the package from the same package library it was
# loaded from before. https://github.com/tidyverse/tidyverse/issues/171
same_library <- function(pkg) {
  loc <- if (pkg %in% loadedNamespaces()) dirname(getNamespaceInfo(pkg, "path"))
  do.call(
    "library",
    list(pkg, lib.loc = loc, character.only = TRUE, warn.conflicts = FALSE)
  )
}

#' erikmisc_attach
#'
#' @importFrom cli rule
#' @importFrom cli symbol
#' @importFrom crayon bold
#' @importFrom crayon green
#' @importFrom crayon blue
#' @importFrom crayon col_align
#' @importFrom crayon col_nchar
erikmisc_attach <- function() {
  to_load <- core_unloaded()
  if (length(to_load) == 0)
    return(invisible())

  msg(
    cli::rule(
      left = crayon::bold("Attaching packages"),
      right = paste0("erikmisc ", package_version("erikmisc"))
    ),
    startup = TRUE
  )

  versions <- vapply(to_load, package_version, character(1))
  packages <- paste0(
    crayon::green(cli::symbol$tick), " ", crayon::blue(format(to_load)), " ",
    crayon::col_align(versions, max(crayon::col_nchar(versions)))
  )

  if (length(packages) %% 2 == 1) {
    packages <- append(packages, "")
  }
  col1 <- seq_len(length(packages) / 2)
  info <- paste0(packages[col1], "     ", packages[-col1])

  msg(paste(info, collapse = "\n"), startup = TRUE)

  suppressPackageStartupMessages(
    lapply(to_load, same_library)
  )

  invisible()
}

#' package_version
#'
#' @param x           package name
#' @importFrom crayon red
package_version <- function(x) {
  version <- as.character(unclass(utils::packageVersion(x))[[1]])

  if (length(version) > 3) {
    version[4:length(version)] <- crayon::red(as.character(version[4:length(version)]))
  }
  paste0(version, collapse = ".")
}
erikerhardt/erikmisc documentation built on April 17, 2025, 10:48 a.m.