R terminal doesn't execute `~/.Rprofile` if renv is enabled and `RENV_CONFIG_USER_PROFILE=TRUE` is set in `~/.Renviron`
Describe the bug
R doesn't execute ~/.Rprofile if renv is enabled and RENV_CONFIG_USER_PROFILE=TRUE is set in ~/.Renviron.
Background: renv is not supposed to source ~/.Rprofile by default, but this can be changed via RENV_CONFIG_USER_PROFILE environment variable.
To Reproduce Steps to reproduce the behavior:
- Create an empty project with
renv::init() - Set
RENV_CONFIG_USER_PROFILE=TRUEin~/.Renviron. - Add some diagnostics code to
~/.Rprofile. E.g.,cat("hello\n"). - Open code session in the project directory.
- Open an R terminal for that project.
Can you fix this issue by yourself? (We appreciate the help)
No
Expected behavior
hello when a new R terminal is started
However, if you start R from terminal in the same directory you see hello.
- OS: macOS and linux
- VSCode Version: 1.82.1
- R Version: 4.3.0
- vscode-R version: 2.8.1
I am also facing the same issue on MacOS.
> radian # called in vscode integrated terminal
- Project '~/project' loaded. [renv 1.0.3.9000; sha: 63f3073]
*** caught bus error ***
address 0x100c6e140, cause 'invalid alignment'
Traceback:
1: dyn.load(file, DLLpath = DLLpath, ...)
2: library.dynam(lib, package, package.lib)
3: loadNamespace(package, ...)
4: doTryCatch(return(expr), name, parentenv, handler)
5: tryCatchOne(expr, names, parentenv, handlers[[1L]])
6: tryCatchList(expr, classes, parentenv, handlers)
7: tryCatch(loadNamespace(package, ...), error = function(e) e)
8: requireNamespace(package, quietly = TRUE)
9: renv_dependencies_require("yaml")
10: renv_knitr_options_chunk(code)
11: as.list(rhs)
12: stopifnot(is.list(x), is.list(val))
13: modifyList(as.list(lhs), as.list(rhs))
14: overlay(params, renv_knitr_options_chunk(code))
15: (function (lhs, rhs) { header <- contents[[lhs]] params <- renv_knitr_options_header(header, type) range <- seq.int(lhs + 1, length.out = rhs - lhs - 1) code <- rep.int("", length(contents)) code[range] <- contents[range] params <- overlay(params, renv_knitr_options_chunk(code)) list(params = params, code = code)})(lhs = dots[[1L]][[1L]], rhs = dots[[2L]][[1L]])
16: .mapply(function(lhs, rhs) { header <- contents[[lhs]] params <- renv_knitr_options_header(header, type) range <- seq.int(lhs + 1, length.out = rhs - lhs - 1) code <- rep.int("", length(contents)) code[range] <- contents[range] params <- overlay(params, renv_knitr_options_chunk(code)) list(params = params, code = code)}, ranges, NULL)
17: renv_dependencies_discover_chunks(path, mode)
18: deps$push(renv_dependencies_discover_chunks(path, mode))
19: renv_dependencies_discover_multimode(path, "qmd")
20: callback(path, ...)
21: filebacked("dependencies", path, callback)
22: doTryCatch(return(expr), name, parentenv, handler)
23: tryCatchOne(expr, names, parentenv, handlers[[1L]])
24: tryCatchList(expr, classes, parentenv, handlers)
25: tryCatch(filebacked("dependencies", path, callback), error = function(cnd) { warning(cnd) NULL})
26: FUN(X[[i]], ...)
27: lapply(x, f, ...)
28: bapply(paths, renv_dependencies_discover_impl)
29: renv_dependencies_discover(files, progress, errors)
30: renv_dependencies_impl(path = path, root = project, field = "Package", errors = config$dependency.errors(), dev = dev)
31: withCallingHandlers(renv_dependencies_impl(path = path, root = project, field = "Package", errors = config$dependency.errors(), dev = dev), renv.dependencies.problems = function(cnd) { if (identical(config$dependency.errors(), "ignored")) return() if (interactive() && !proceed()) cancel() }, renv.dependencies.count = function(cnd) { count[[cnd$data$path]] <<- cnd$data$count }, renv.dependencies.elapsed_time = function(cnd) { if (!type %in% c("packrat", "implicit")) return() elapsed <- cnd$data limit <- getOption("renv.dependencies.elapsed_time_threshold", default = 10L) if (elapsed < limit) return() count <- count[order(count)] count <- count[count >= 200] lines <- c("", "NOTE: Dependency discovery took %s during snapshot.", "Consider using .renvignore to ignore files, or switching to explicit snapshots.", "See `?renv::dependencies` for more information.", if (length(count)) c("", sprintf("- %s: %s", format(names(count)), nplural("file", count))), "") renv_scope_caution(TRUE) caution(lines, renv_difftime_format(elapsed)) })
32: renv_snapshot_dependencies_impl(project, type, dev)
33: the$dynamic_objects[[id]] %||% { dlog("dynamic", "memoizing dynamic value for '%s'", id) value}
34: dynamic(list(project = project, type = type, dev = dev), renv_snapshot_dependencies_impl(project, type, dev))
35: renv_snapshot_dependencies(project, dev = dev)
36: status(project = project, sources = FALSE)
37: (function() { renv_scope_options(renv.verbose = FALSE) renv_scope_caution(FALSE) status(project = project, sources = FALSE)})()
38: renv_load_report_synchronized(project, lockfile)
39: renv_load_finish(project, lockfile)
40: renv::load(project)
41: renv_bootstrap_load(project, libpath, version)
42: renv_bootstrap_exec(project, libpath, version)
43: eval(quote({ version <- "1.0.3.9000" attr(version, "sha") <- NULL project <- getwd() diagnostics <- Sys.getenv("RENV_STARTUP_DIAGNOSTICS", unset = "FALSE") if (diagnostics) { start <- Sys.time() profile <- tempfile("renv-startup-", fileext = ".Rprof") utils::Rprof(profile) on.exit({ utils::Rprof(NULL) elapsed <- signif(difftime(Sys.time(), start, units = "auto"), digits = 2L) writeLines(sprintf("- renv took %s to run the autoloader.", format(elapsed))) writeLines(sprintf("- Profile: %s", profile)) print(utils::summaryRprof(profile)) }, add = TRUE) } enabled <- local({ override <- getOption("renv.config.autoloader.enabled") if (!is.null(override)) return(override) envvars <- c("RENV_CONFIG_AUTOLOADER_ENABLED", "RENV_AUTOLOADER_ENABLED", "RENV_ACTIVATE_PROJECT") for (envvar in envvars) { envval <- Sys.getenv(envvar, unset = NA) if (!is.na(envval)) return(tolower(envval) %in% c("true", "t", "1")) } TRUE }) if (!enabled) return(FALSE) if (identical(getOption("renv.autoloader.running"), TRUE)) { warning("ignoring recursive attempt to run renv autoloader") return(invisible(TRUE)) } options(renv.autoloader.running = TRUE) on.exit(options(renv.autoloader.running = NULL), add = TRUE) options(renv.consent = TRUE) library(utils, lib.loc = .Library) if ("renv" %in% loadedNamespaces()) unloadNamespace("renv") `%||%` <- function(x, y) { if (is.null(x)) y else x } catf <- function(fmt, ..., appendLF = TRUE) { quiet <- getOption("renv.bootstrap.quiet", default = FALSE) if (quiet) return(invisible()) msg <- sprintf(fmt, ...) cat(msg, file = stdout(), sep = if (appendLF) "\n" else "") invisible(msg) } header <- function(label, ..., prefix = "#", suffix = "-", n = min(getOption("width"), 78)) { label <- sprintf(label, ...) n <- max(n - nchar(label) - nchar(prefix) - 2L, 8L) if (n <= 0) return(paste(prefix, label)) tail <- paste(rep.int(suffix, n), collapse = "") paste0(prefix, " ", label, " ", tail) } startswith <- function(string, prefix) { substring(string, 1, nchar(prefix)) == prefix } bootstrap <- function(version, library) { friendly <- renv_bootstrap_version_friendly(version) section <- header(sprintf("Bootstrapping renv %s", friendly)) catf(section) catf("- Downloading renv ... ", appendLF = FALSE) withCallingHandlers(tarball <- renv_bootstrap_download(version), error = function(err) { catf("FAILED") stop("failed to download:\n", conditionMessage(err)) }) catf("OK") on.exit(unlink(tarball), add = TRUE) catf("- Installing renv ... ", appendLF = FALSE) withCallingHandlers(status <- renv_bootstrap_install(version, tarball, library), error = function(err) { catf("FAILED") stop("failed to install:\n", conditionMessage(err)) }) catf("OK") catf("") return(invisible()) } renv_bootstrap_tests_running <- function() { getOption("renv.tests.running", default = FALSE) } renv_bootstrap_repos <- function() { cran <- getOption("renv.repos.cran", "https://cloud.r-project.org") repos <- Sys.getenv("RENV_CONFIG_REPOS_OVERRIDE", unset = NA) if (!is.na(repos)) { rspm <- Sys.getenv("RSPM", unset = NA) if (identical(rspm, repos)) repos <- c(RSPM = rspm, CRAN = cran) return(repos) } repos <- tryCatch(renv_bootstrap_repos_lockfile(), error = identity) if (!inherits(repos, "error") && length(repos)) return(repos) repos <- getOption("repos") repos[repos == "@CRAN@"] <- cran default <- c(FALLBACK = "https://cloud.r-project.org") extra <- getOption("renv.bootstrap.repos", default = default) repos <- c(repos, extra) dupes <- duplicated(repos) | duplicated(names(repos)) repos[!dupes] } renv_bootstrap_repos_lockfile <- function() { lockpath <- Sys.getenv("RENV_PATHS_LOCKFILE", unset = "renv.lock") if (!file.exists(lockpath)) return(NULL) lockfile <- tryCatch(renv_json_read(lockpath), error = identity) if (inherits(lockfile, "error")) { warning(lockfile) return(NULL) } repos <- lockfile$R$Repositories if (length(repos) == 0) return(NULL) keys <- vapply(repos, `[[`, "Name", FUN.VALUE = character(1)) vals <- vapply(repos, `[[`, "URL", FUN.VALUE = character(1)) names(vals) <- keys return(vals) } renv_bootstrap_download <- function(version) { sha <- attr(version, "sha", exact = TRUE) methods <- if (!is.null(sha)) { c(function() renv_bootstrap_download_tarball(sha), function() renv_bootstrap_download_github(sha)) } else { c(function() renv_bootstrap_download_tarball(version), function() renv_bootstrap_download_cran_latest(version), function() renv_bootstrap_download_cran_archive(version)) } for (method in methods) { path <- tryCatch(method(), error = identity) if (is.character(path) && file.exists(path)) return(path) } stop("All download methods failed") } renv_bootstrap_download_impl <- function(url, destfile) { mode <- "wb" fixup <- Sys.info()[["sysname"]] == "Windows" && substring(url, 1L, 5L) == "file:" if (fixup) mode <- "w+b" args <- list(url = url, destfile = destfile, mode = mode, quiet = TRUE) if ("headers" %in% names(formals(utils::download.file))) args$headers <- renv_bootstrap_download_custom_headers(url) do.call(utils::download.file, args) } renv_bootstrap_download_custom_headers <- function(url) { headers <- getOption("renv.download.headers") if (is.null(headers)) return(character()) if (!is.function(headers)) stopf("'renv.download.headers' is not a function") headers <- headers(url) if (length(headers) == 0L) return(character()) if (is.list(headers)) headers <- unlist(headers, recursive = FALSE, use.names = TRUE) ok <- is.character(headers) && is.character(names(headers)) && all(nzchar(names(headers))) if (!ok) stop("invocation of 'renv.download.headers' did not return a named character vector") headers } renv_bootstrap_download_cran_latest <- function(version) { spec <- renv_bootstrap_download_cran_latest_find(version) type <- spec$type repos <- spec$repos baseurl <- utils::contrib.url(repos = repos, type = type) ext <- if (identical(type, "source")) ".tar.gz" else if (Sys.info()[["sysname"]] == "Windows") ".zip" else ".tgz" name <- sprintf("renv_%s%s", version, ext) url <- paste(baseurl, name, sep = "/") destfile <- file.path(tempdir(), name) status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (inherits(status, "condition")) return(FALSE) destfile } renv_bootstrap_download_cran_latest_find <- function(version) { binary <- getOption("renv.bootstrap.binary", default = TRUE) && !identical(.Platform$pkgType, "source") && !identical(getOption("pkgType"), "source") && Sys.info()[["sysname"]] %in% c("Darwin", "Windows") types <- c(if (binary) "binary", "source") for (type in types) { for (repos in renv_bootstrap_repos()) { db <- tryCatch(as.data.frame(utils::available.packages(type = type, repos = repos), stringsAsFactors = FALSE), error = identity) if (inherits(db, "error")) next entry <- db[db$Package %in% "renv" & db$Version %in% version, ] if (nrow(entry) == 0) next spec <- list(entry = entry, type = type, repos = repos) return(spec) } } fmt <- "renv %s is not available from your declared package repositories" stop(sprintf(fmt, version)) } renv_bootstrap_download_cran_archive <- function(version) { name <- sprintf("renv_%s.tar.gz", version) repos <- renv_bootstrap_repos() urls <- file.path(repos, "src/contrib/Archive/renv", name) destfile <- file.path(tempdir(), name) for (url in urls) { status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (identical(status, 0L)) return(destfile) } return(FALSE) } renv_bootstrap_download_tarball <- function(version) { tarball <- Sys.getenv("RENV_BOOTSTRAP_TARBALL", unset = NA) if (is.na(tarball)) return() if (dir.exists(tarball)) { name <- sprintf("renv_%s.tar.gz", version) tarball <- file.path(tarball, name) } if (!file.exists(tarball)) { fmt <- "- RENV_BOOTSTRAP_TARBALL is set (%s) but does not exist." msg <- sprintf(fmt, tarball) warning(msg) return() } catf("- Using local tarball '%s'.", tarball) tarball } renv_bootstrap_download_github <- function(version) { enabled <- Sys.getenv("RENV_BOOTSTRAP_FROM_GITHUB", unset = "TRUE") if (!identical(enabled, "TRUE")) return(FALSE) pat <- Sys.getenv("GITHUB_PAT") if (nzchar(Sys.which("curl")) && nzchar(pat)) { fmt <- "--location --fail --header \"Authorization: token %s\"" extra <- sprintf(fmt, pat) saved <- options("download.file.method", "download.file.extra") options(download.file.method = "curl", download.file.extra = extra) on.exit(do.call(base::options, saved), add = TRUE) } else if (nzchar(Sys.which("wget")) && nzchar(pat)) { fmt <- "--header=\"Authorization: token %s\"" extra <- sprintf(fmt, pat) saved <- options("download.file.method", "download.file.extra") options(download.file.method = "wget", download.file.extra = extra) on.exit(do.call(base::options, saved), add = TRUE) } url <- file.path("https://api.github.com/repos/rstudio/renv/tarball", version) name <- sprintf("renv_%s.tar.gz", version) destfile <- file.path(tempdir(), name) status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (!identical(status, 0L)) return(FALSE) renv_bootstrap_download_augment(destfile) return(destfile) } renv_bootstrap_download_augment <- function(destfile) { sha <- renv_bootstrap_git_extract_sha1_tar(destfile) if (is.null(sha)) { return() } tempdir <- tempfile("renv-github-") on.exit(unlink(tempdir, recursive = TRUE), add = TRUE) untar(destfile, exdir = tempdir) pkgdir <- dir(tempdir, full.names = TRUE)[[1]] desc_path <- file.path(pkgdir, "DESCRIPTION") desc_lines <- readLines(desc_path) remotes_fields <- c("RemoteType: github", "RemoteHost: api.github.com", "RemoteRepo: renv", "RemoteUsername: rstudio", "RemotePkgRef: rstudio/renv", paste("RemoteRef: ", sha), paste("RemoteSha: ", sha)) writeLines(c(desc_lines[desc_lines != ""], remotes_fields), con = desc_path) local({ old <- setwd(tempdir) on.exit(setwd(old), add = TRUE) tar(destfile, compression = "gzip") }) invisible() } renv_bootstrap_git_extract_sha1_tar <- function(bundle) { conn <- gzcon(file(bundle, open = "rb", raw = TRUE)) on.exit(close(conn)) len <- 512 + 51 res <- rawToChar(readBin(conn, "raw", n = len)[513:len]) if (grepl("^52 comment=", res)) { sub("52 comment=", "", res) } else { NULL } } renv_bootstrap_install <- function(version, tarball, library) { dir.create(library, showWarnings = FALSE, recursive = TRUE) output <- renv_bootstrap_install_impl(library, tarball) status <- attr(output, "status") if (is.null(status) || identical(status, 0L)) return(status) header <- "installation of renv failed" lines <- paste(rep.int("=", nchar(header)), collapse = "") text <- paste(c(header, lines, output), collapse = "\n") stop(text) } renv_bootstrap_install_impl <- function(library, tarball) { bin <- R.home("bin") exe <- if (Sys.info()[["sysname"]] == "Windows") "R.exe" else "R" R <- file.path(bin, exe) args <- c("--vanilla", "CMD", "INSTALL", "--no-multiarch", "-l", shQuote(path.expand(library)), shQuote(path.expand(tarball))) system2(R, args, stdout = TRUE, stderr = TRUE) } renv_bootstrap_platform_prefix <- function() { version <- paste(R.version$major, R.version$minor, sep = ".") prefix <- paste("R", numeric_version(version)[1, 1:2], sep = "-") devel <- identical(R.version[["status"]], "Under development (unstable)") || identical(R.version[["nickname"]], "Unsuffered Consequences") if (devel) prefix <- paste(prefix, R.version[["svn rev"]], sep = "-r") components <- c(prefix, R.version$platform) prefix <- renv_bootstrap_platform_prefix_impl() if (!is.na(prefix) && nzchar(prefix)) components <- c(prefix, components) paste(components, collapse = "/") } renv_bootstrap_platform_prefix_impl <- function() { prefix <- Sys.getenv("RENV_PATHS_PREFIX", unset = NA) if (!is.na(prefix)) return(prefix) auto <- Sys.getenv("RENV_PATHS_PREFIX_AUTO", unset = NA) if (auto %in% c("TRUE", "True", "true", "1")) return(renv_bootstrap_platform_prefix_auto()) "" } renv_bootstrap_platform_prefix_auto <- function() { prefix <- tryCatch(renv_bootstrap_platform_os(), error = identity) if (inherits(prefix, "error") || prefix %in% "unknown") { msg <- paste("failed to infer current operating system", "please file a bug report at https://github.com/rstudio/renv/issues", sep = "; ") warning(msg) } prefix } renv_bootstrap_platform_os <- function() { sysinfo <- Sys.info() sysname <- sysinfo[["sysname"]] if (sysname == "Windows") return("windows") else if (sysname == "Darwin") return("macos") for (file in c("/etc/os-release", "/usr/lib/os-release")) if (file.exists(file)) return(renv_bootstrap_platform_os_via_os_release(file, sysinfo)) if (file.exists("/etc/redhat-release")) return(renv_bootstrap_platform_os_via_redhat_release()) "unknown" } renv_bootstrap_platform_os_via_os_release <- function(file, sysinfo) { release <- utils::read.table(file = file, sep = "=", quote = c("\"", "'"), col.names = c("Key", "Value"), comment.char = "#", stringsAsFactors = FALSE) vars <- as.list(release$Value) names(vars) <- release$Key os <- tolower(sysinfo[["sysname"]]) id <- "unknown" for (field in c("ID", "ID_LIKE")) { if (field %in% names(vars) && nzchar(vars[[field]])) { id <- vars[[field]] break } } version <- "unknown" for (field in c("UBUNTU_CODENAME", "VERSION_CODENAME", "VERSION_ID", "BUILD_ID")) { if (field %in% names(vars) && nzchar(vars[[field]])) { version <- vars[[field]] break } } paste(c(os, id, version), collapse = "-") } renv_bootstrap_platform_os_via_redhat_release <- function() { contents <- readLines("/etc/redhat-release", warn = FALSE) id <- if (grepl("centos", contents, ignore.case = TRUE)) "centos" else if (grepl("redhat", contents, ignore.case = TRUE)) "redhat" else "unknown" version <- "unknown" parts <- strsplit(contents, "[[:space:]]")[[1L]] for (part in parts) { nv <- tryCatch(numeric_version(part), error = identity) if (inherits(nv, "error")) next version <- nv[1, 1] break } paste(c("linux", id, version), collapse = "-") } renv_bootstrap_library_root_name <- function(project) { asis <- Sys.getenv("RENV_PATHS_LIBRARY_ROOT_ASIS", unset = "FALSE") if (asis) return(basename(project)) id <- substring(renv_bootstrap_hash_text(project), 1L, 8L) paste(basename(project), id, sep = "-") } renv_bootstrap_library_root <- function(project) { prefix <- renv_bootstrap_profile_prefix() path <- Sys.getenv("RENV_PATHS_LIBRARY", unset = NA) if (!is.na(path)) return(paste(c(path, prefix), collapse = "/")) path <- renv_bootstrap_library_root_impl(project) if (!is.null(path)) { name <- renv_bootstrap_library_root_name(project) return(paste(c(path, prefix, name), collapse = "/")) } renv_bootstrap_paths_renv("library", project = project) } renv_bootstrap_library_root_impl <- function(project) { root <- Sys.getenv("RENV_PATHS_LIBRARY_ROOT", unset = NA) if (!is.na(root)) return(root) type <- renv_bootstrap_project_type(project) if (identical(type, "package")) { userdir <- renv_bootstrap_user_dir() return(file.path(userdir, "library")) } } renv_bootstrap_validate_version <- function(version, description = NULL) { description <- description %||% packageDescription("renv") sha <- attr(version, "sha", exact = TRUE) valid <- if (!is.null(sha)) renv_bootstrap_validate_version_dev(sha, description) else renv_bootstrap_validate_version_release(version, description) if (valid) return(TRUE) remote <- if (!is.null(description[["RemoteSha"]])) { paste("rstudio/renv", description[["RemoteSha"]], sep = "@") } else { paste("renv", description[["Version"]], sep = "@") } friendly <- renv_bootstrap_version_friendly(version = description[["Version"]], sha = description[["RemoteSha"]]) fmt <- paste("renv %1$s was loaded from project library, but this project is configured to use renv %2$s.", "- Use `renv::record(\"%3$s\")` to record renv %1$s in the lockfile.", "- Use `renv::restore(packages = \"renv\")` to install renv %2$s into the project library.", sep = "\n") catf(fmt, friendly, renv_bootstrap_version_friendly(version), remote) FALSE } renv_bootstrap_validate_version_dev <- function(version, description) { expected <- description[["RemoteSha"]] is.character(expected) && startswith(expected, version) } renv_bootstrap_validate_version_release <- function(version, description) { expected <- description[["Version"]] is.character(expected) && identical(expected, version) } renv_bootstrap_hash_text <- function(text) { hashfile <- tempfile("renv-hash-") on.exit(unlink(hashfile), add = TRUE) writeLines(text, con = hashfile) tools::md5sum(hashfile) } renv_bootstrap_load <- function(project, libpath, version) { if (!requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) return(FALSE) renv_bootstrap_validate_version(version) hooks <- getHook("renv::autoload") for (hook in hooks) if (is.function(hook)) tryCatch(hook(), error = warnify) renv::load(project) TRUE } renv_bootstrap_profile_load <- function(project) { profile <- Sys.getenv("RENV_PROFILE", unset = NA) if (!is.na(profile) && nzchar(profile)) return(profile) path <- renv_bootstrap_paths_renv("profile", profile = FALSE, project = project) if (!file.exists(path)) return(NULL) contents <- readLines(path, warn = FALSE) if (length(contents) == 0L) return(NULL) profile <- contents[[1L]] if (!profile %in% c("", "default")) Sys.setenv(RENV_PROFILE = profile) profile } renv_bootstrap_profile_prefix <- function() { profile <- renv_bootstrap_profile_get() if (!is.null(profile)) return(file.path("profiles", profile, "renv")) } renv_bootstrap_profile_get <- function() { profile <- Sys.getenv("RENV_PROFILE", unset = "") renv_bootstrap_profile_normalize(profile) } renv_bootstrap_profile_set <- function(profile) { profile <- renv_bootstrap_profile_normalize(profile) if (is.null(profile)) Sys.unsetenv("RENV_PROFILE") else Sys.setenv(RENV_PROFILE = profile) } renv_bootstrap_profile_normalize <- function(profile) { if (is.null(profile) || profile %in% c("", "default")) return(NULL) profile } renv_bootstrap_path_absolute <- function(path) { substr(path, 1L, 1L) %in% c("~", "/", "\\") || (substr(path, 1L, 1L) %in% c(letters, LETTERS) && substr(path, 2L, 3L) %in% c(":/", ":\\")) } renv_bootstrap_paths_renv <- function(..., profile = TRUE, project = NULL) { renv <- Sys.getenv("RENV_PATHS_RENV", unset = "renv") root <- if (renv_bootstrap_path_absolute(renv)) NULL else project prefix <- if (profile) renv_bootstrap_profile_prefix() components <- c(root, renv, prefix, ...) paste(components, collapse = "/") } renv_bootstrap_project_type <- function(path) { descpath <- file.path(path, "DESCRIPTION") if (!file.exists(descpath)) return("unknown") desc <- tryCatch(read.dcf(descpath, all = TRUE), error = identity) if (inherits(desc, "error")) return("unknown") type <- desc$Type if (!is.null(type)) return(tolower(type)) package <- desc$Package if (!is.null(package)) return("package") "unknown" } renv_bootstrap_user_dir <- function() { dir <- renv_bootstrap_user_dir_impl() path.expand(chartr("\\", "/", dir)) } renv_bootstrap_user_dir_impl <- function() { override <- getOption("renv.userdir.override") if (!is.null(override)) return(override) tools <- asNamespace("tools") if (is.function(tools$R_user_dir)) return(tools$R_user_dir("renv", "cache")) envvars <- c("R_USER_CACHE_DIR", "XDG_CACHE_HOME") for (envvar in envvars) { root <- Sys.getenv(envvar, unset = NA) if (!is.na(root)) return(file.path(root, "R/renv")) } if (Sys.info()[["sysname"]] == "Windows") file.path(Sys.getenv("LOCALAPPDATA"), "R/cache/R/renv") else if (Sys.info()[["sysname"]] == "Darwin") "~/Library/Caches/org.R-project.R/R/renv" else "~/.cache/R/renv" } renv_bootstrap_version_friendly <- function(version, shafmt = NULL, sha = NULL) { sha <- sha %||% attr(version, "sha", exact = TRUE) parts <- c(version, sprintf(shafmt %||% " [sha: %s]", substring(sha, 1L, 7L))) paste(parts, collapse = "") } renv_bootstrap_exec <- function(project, libpath, version) { if (!renv_bootstrap_load(project, libpath, version)) renv_bootstrap_run(version, libpath) } renv_bootstrap_run <- function(version, libpath) { bootstrap(version, libpath) if (!is.na(Sys.getenv("RENV_BOOTSTRAP_INSTALL_ONLY", unset = NA))) return(TRUE) if (requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) { return(renv::load(project = getwd())) } msg <- c("Failed to find an renv installation: the project will not be loaded.", "Use `renv::activate()` to re-initialize the project.") warning(paste(msg, collapse = "\n"), call. = FALSE) } renv_json_read <- function(file = NULL, text = NULL) { jlerr <- NULL if ("jsonlite" %in% loadedNamespaces()) { json <- catch(renv_json_read_jsonlite(file, text)) if (!inherits(json, "error")) return(json) jlerr <- json } json <- catch(renv_json_read_default(file, text)) if (!inherits(json, "error")) return(json) if (!is.null(jlerr)) stop(jlerr) else stop(json) } renv_json_read_jsonlite <- function(file = NULL, text = NULL) { text <- paste(text %||% read(file), collapse = "\n") jsonlite::fromJSON(txt = text, simplifyVector = FALSE) } renv_json_read_default <- function(file = NULL, text = NULL) { text <- paste(text %||% read(file), collapse = "\n") pattern <- "[\"](?:(?:\\\\.)|(?:[^\"\\\\]))*?[\"]" locs <- gregexpr(pattern, text, perl = TRUE)[[1]] replaced <- text strings <- character() replacements <- character() if (!identical(c(locs), -1L)) { starts <- locs ends <- locs + attr(locs, "match.length") - 1L strings <- substring(text, starts, ends) strings <- grep("[[\\]{}:]", strings, perl = TRUE, value = TRUE) replacements <- sprintf("\"\032%i\032\"", seq_along(strings)) mapply(function(string, replacement) { replaced <<- sub(string, replacement, replaced, fixed = TRUE) }, strings, replacements) } transformed <- replaced transformed <- gsub("{}", "`names<-`(list(), character())", transformed, fixed = TRUE) transformed <- gsub("[[{]", "list(", transformed, perl = TRUE) transformed <- gsub("[]}]", ")", transformed, perl = TRUE) transformed <- gsub(":", "=", transformed, fixed = TRUE) text <- paste(transformed, collapse = "\n") json <- parse(text = text, keep.source = FALSE, srcfile = NULL)[[1L]] map <- as.character(parse(text = strings)) names(map) <- as.character(parse(text = replacements)) map <- as.list(map) remapped <- renv_json_remap(json, map) eval(remapped, envir = baseenv()) } renv_json_remap <- function(json, map) { if (!is.null(names(json))) { lhs <- match(names(json), names(map), nomatch = 0L) rhs <- match(names(map), names(json), nomatch = 0L) names(json)[rhs] <- map[lhs] } if (is.character(json)) return(map[[json]] %||% json) if (is.name(json)) { text <- as.character(json) if (text == "true") return(TRUE) else if (text == "false") return(FALSE) else if (text == "null") return(NULL) } if (is.recursive(json)) { for (i in seq_along(json)) { json[i] <- list(renv_json_remap(json[[i]], map)) } } json } renv_bootstrap_profile_load(project) root <- renv_bootstrap_library_root(project) prefix <- renv_bootstrap_platform_prefix() libpath <- file.path(root, prefix) renv_bootstrap_exec(project, libpath, version) invisible()}), new.env())
44: eval(quote({ version <- "1.0.3.9000" attr(version, "sha") <- NULL project <- getwd() diagnostics <- Sys.getenv("RENV_STARTUP_DIAGNOSTICS", unset = "FALSE") if (diagnostics) { start <- Sys.time() profile <- tempfile("renv-startup-", fileext = ".Rprof") utils::Rprof(profile) on.exit({ utils::Rprof(NULL) elapsed <- signif(difftime(Sys.time(), start, units = "auto"), digits = 2L) writeLines(sprintf("- renv took %s to run the autoloader.", format(elapsed))) writeLines(sprintf("- Profile: %s", profile)) print(utils::summaryRprof(profile)) }, add = TRUE) } enabled <- local({ override <- getOption("renv.config.autoloader.enabled") if (!is.null(override)) return(override) envvars <- c("RENV_CONFIG_AUTOLOADER_ENABLED", "RENV_AUTOLOADER_ENABLED", "RENV_ACTIVATE_PROJECT") for (envvar in envvars) { envval <- Sys.getenv(envvar, unset = NA) if (!is.na(envval)) return(tolower(envval) %in% c("true", "t", "1")) } TRUE }) if (!enabled) return(FALSE) if (identical(getOption("renv.autoloader.running"), TRUE)) { warning("ignoring recursive attempt to run renv autoloader") return(invisible(TRUE)) } options(renv.autoloader.running = TRUE) on.exit(options(renv.autoloader.running = NULL), add = TRUE) options(renv.consent = TRUE) library(utils, lib.loc = .Library) if ("renv" %in% loadedNamespaces()) unloadNamespace("renv") `%||%` <- function(x, y) { if (is.null(x)) y else x } catf <- function(fmt, ..., appendLF = TRUE) { quiet <- getOption("renv.bootstrap.quiet", default = FALSE) if (quiet) return(invisible()) msg <- sprintf(fmt, ...) cat(msg, file = stdout(), sep = if (appendLF) "\n" else "") invisible(msg) } header <- function(label, ..., prefix = "#", suffix = "-", n = min(getOption("width"), 78)) { label <- sprintf(label, ...) n <- max(n - nchar(label) - nchar(prefix) - 2L, 8L) if (n <= 0) return(paste(prefix, label)) tail <- paste(rep.int(suffix, n), collapse = "") paste0(prefix, " ", label, " ", tail) } startswith <- function(string, prefix) { substring(string, 1, nchar(prefix)) == prefix } bootstrap <- function(version, library) { friendly <- renv_bootstrap_version_friendly(version) section <- header(sprintf("Bootstrapping renv %s", friendly)) catf(section) catf("- Downloading renv ... ", appendLF = FALSE) withCallingHandlers(tarball <- renv_bootstrap_download(version), error = function(err) { catf("FAILED") stop("failed to download:\n", conditionMessage(err)) }) catf("OK") on.exit(unlink(tarball), add = TRUE) catf("- Installing renv ... ", appendLF = FALSE) withCallingHandlers(status <- renv_bootstrap_install(version, tarball, library), error = function(err) { catf("FAILED") stop("failed to install:\n", conditionMessage(err)) }) catf("OK") catf("") return(invisible()) } renv_bootstrap_tests_running <- function() { getOption("renv.tests.running", default = FALSE) } renv_bootstrap_repos <- function() { cran <- getOption("renv.repos.cran", "https://cloud.r-project.org") repos <- Sys.getenv("RENV_CONFIG_REPOS_OVERRIDE", unset = NA) if (!is.na(repos)) { rspm <- Sys.getenv("RSPM", unset = NA) if (identical(rspm, repos)) repos <- c(RSPM = rspm, CRAN = cran) return(repos) } repos <- tryCatch(renv_bootstrap_repos_lockfile(), error = identity) if (!inherits(repos, "error") && length(repos)) return(repos) repos <- getOption("repos") repos[repos == "@CRAN@"] <- cran default <- c(FALLBACK = "https://cloud.r-project.org") extra <- getOption("renv.bootstrap.repos", default = default) repos <- c(repos, extra) dupes <- duplicated(repos) | duplicated(names(repos)) repos[!dupes] } renv_bootstrap_repos_lockfile <- function() { lockpath <- Sys.getenv("RENV_PATHS_LOCKFILE", unset = "renv.lock") if (!file.exists(lockpath)) return(NULL) lockfile <- tryCatch(renv_json_read(lockpath), error = identity) if (inherits(lockfile, "error")) { warning(lockfile) return(NULL) } repos <- lockfile$R$Repositories if (length(repos) == 0) return(NULL) keys <- vapply(repos, `[[`, "Name", FUN.VALUE = character(1)) vals <- vapply(repos, `[[`, "URL", FUN.VALUE = character(1)) names(vals) <- keys return(vals) } renv_bootstrap_download <- function(version) { sha <- attr(version, "sha", exact = TRUE) methods <- if (!is.null(sha)) { c(function() renv_bootstrap_download_tarball(sha), function() renv_bootstrap_download_github(sha)) } else { c(function() renv_bootstrap_download_tarball(version), function() renv_bootstrap_download_cran_latest(version), function() renv_bootstrap_download_cran_archive(version)) } for (method in methods) { path <- tryCatch(method(), error = identity) if (is.character(path) && file.exists(path)) return(path) } stop("All download methods failed") } renv_bootstrap_download_impl <- function(url, destfile) { mode <- "wb" fixup <- Sys.info()[["sysname"]] == "Windows" && substring(url, 1L, 5L) == "file:" if (fixup) mode <- "w+b" args <- list(url = url, destfile = destfile, mode = mode, quiet = TRUE) if ("headers" %in% names(formals(utils::download.file))) args$headers <- renv_bootstrap_download_custom_headers(url) do.call(utils::download.file, args) } renv_bootstrap_download_custom_headers <- function(url) { headers <- getOption("renv.download.headers") if (is.null(headers)) return(character()) if (!is.function(headers)) stopf("'renv.download.headers' is not a function") headers <- headers(url) if (length(headers) == 0L) return(character()) if (is.list(headers)) headers <- unlist(headers, recursive = FALSE, use.names = TRUE) ok <- is.character(headers) && is.character(names(headers)) && all(nzchar(names(headers))) if (!ok) stop("invocation of 'renv.download.headers' did not return a named character vector") headers } renv_bootstrap_download_cran_latest <- function(version) { spec <- renv_bootstrap_download_cran_latest_find(version) type <- spec$type repos <- spec$repos baseurl <- utils::contrib.url(repos = repos, type = type) ext <- if (identical(type, "source")) ".tar.gz" else if (Sys.info()[["sysname"]] == "Windows") ".zip" else ".tgz" name <- sprintf("renv_%s%s", version, ext) url <- paste(baseurl, name, sep = "/") destfile <- file.path(tempdir(), name) status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (inherits(status, "condition")) return(FALSE) destfile } renv_bootstrap_download_cran_latest_find <- function(version) { binary <- getOption("renv.bootstrap.binary", default = TRUE) && !identical(.Platform$pkgType, "source") && !identical(getOption("pkgType"), "source") && Sys.info()[["sysname"]] %in% c("Darwin", "Windows") types <- c(if (binary) "binary", "source") for (type in types) { for (repos in renv_bootstrap_repos()) { db <- tryCatch(as.data.frame(utils::available.packages(type = type, repos = repos), stringsAsFactors = FALSE), error = identity) if (inherits(db, "error")) next entry <- db[db$Package %in% "renv" & db$Version %in% version, ] if (nrow(entry) == 0) next spec <- list(entry = entry, type = type, repos = repos) return(spec) } } fmt <- "renv %s is not available from your declared package repositories" stop(sprintf(fmt, version)) } renv_bootstrap_download_cran_archive <- function(version) { name <- sprintf("renv_%s.tar.gz", version) repos <- renv_bootstrap_repos() urls <- file.path(repos, "src/contrib/Archive/renv", name) destfile <- file.path(tempdir(), name) for (url in urls) { status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (identical(status, 0L)) return(destfile) } return(FALSE) } renv_bootstrap_download_tarball <- function(version) { tarball <- Sys.getenv("RENV_BOOTSTRAP_TARBALL", unset = NA) if (is.na(tarball)) return() if (dir.exists(tarball)) { name <- sprintf("renv_%s.tar.gz", version) tarball <- file.path(tarball, name) } if (!file.exists(tarball)) { fmt <- "- RENV_BOOTSTRAP_TARBALL is set (%s) but does not exist." msg <- sprintf(fmt, tarball) warning(msg) return() } catf("- Using local tarball '%s'.", tarball) tarball } renv_bootstrap_download_github <- function(version) { enabled <- Sys.getenv("RENV_BOOTSTRAP_FROM_GITHUB", unset = "TRUE") if (!identical(enabled, "TRUE")) return(FALSE) pat <- Sys.getenv("GITHUB_PAT") if (nzchar(Sys.which("curl")) && nzchar(pat)) { fmt <- "--location --fail --header \"Authorization: token %s\"" extra <- sprintf(fmt, pat) saved <- options("download.file.method", "download.file.extra") options(download.file.method = "curl", download.file.extra = extra) on.exit(do.call(base::options, saved), add = TRUE) } else if (nzchar(Sys.which("wget")) && nzchar(pat)) { fmt <- "--header=\"Authorization: token %s\"" extra <- sprintf(fmt, pat) saved <- options("download.file.method", "download.file.extra") options(download.file.method = "wget", download.file.extra = extra) on.exit(do.call(base::options, saved), add = TRUE) } url <- file.path("https://api.github.com/repos/rstudio/renv/tarball", version) name <- sprintf("renv_%s.tar.gz", version) destfile <- file.path(tempdir(), name) status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (!identical(status, 0L)) return(FALSE) renv_bootstrap_download_augment(destfile) return(destfile) } renv_bootstrap_download_augment <- function(destfile) { sha <- renv_bootstrap_git_extract_sha1_tar(destfile) if (is.null(sha)) { return() } tempdir <- tempfile("renv-github-") on.exit(unlink(tempdir, recursive = TRUE), add = TRUE) untar(destfile, exdir = tempdir) pkgdir <- dir(tempdir, full.names = TRUE)[[1]] desc_path <- file.path(pkgdir, "DESCRIPTION") desc_lines <- readLines(desc_path) remotes_fields <- c("RemoteType: github", "RemoteHost: api.github.com", "RemoteRepo: renv", "RemoteUsername: rstudio", "RemotePkgRef: rstudio/renv", paste("RemoteRef: ", sha), paste("RemoteSha: ", sha)) writeLines(c(desc_lines[desc_lines != ""], remotes_fields), con = desc_path) local({ old <- setwd(tempdir) on.exit(setwd(old), add = TRUE) tar(destfile, compression = "gzip") }) invisible() } renv_bootstrap_git_extract_sha1_tar <- function(bundle) { conn <- gzcon(file(bundle, open = "rb", raw = TRUE)) on.exit(close(conn)) len <- 512 + 51 res <- rawToChar(readBin(conn, "raw", n = len)[513:len]) if (grepl("^52 comment=", res)) { sub("52 comment=", "", res) } else { NULL } } renv_bootstrap_install <- function(version, tarball, library) { dir.create(library, showWarnings = FALSE, recursive = TRUE) output <- renv_bootstrap_install_impl(library, tarball) status <- attr(output, "status") if (is.null(status) || identical(status, 0L)) return(status) header <- "installation of renv failed" lines <- paste(rep.int("=", nchar(header)), collapse = "") text <- paste(c(header, lines, output), collapse = "\n") stop(text) } renv_bootstrap_install_impl <- function(library, tarball) { bin <- R.home("bin") exe <- if (Sys.info()[["sysname"]] == "Windows") "R.exe" else "R" R <- file.path(bin, exe) args <- c("--vanilla", "CMD", "INSTALL", "--no-multiarch", "-l", shQuote(path.expand(library)), shQuote(path.expand(tarball))) system2(R, args, stdout = TRUE, stderr = TRUE) } renv_bootstrap_platform_prefix <- function() { version <- paste(R.version$major, R.version$minor, sep = ".") prefix <- paste("R", numeric_version(version)[1, 1:2], sep = "-") devel <- identical(R.version[["status"]], "Under development (unstable)") || identical(R.version[["nickname"]], "Unsuffered Consequences") if (devel) prefix <- paste(prefix, R.version[["svn rev"]], sep = "-r") components <- c(prefix, R.version$platform) prefix <- renv_bootstrap_platform_prefix_impl() if (!is.na(prefix) && nzchar(prefix)) components <- c(prefix, components) paste(components, collapse = "/") } renv_bootstrap_platform_prefix_impl <- function() { prefix <- Sys.getenv("RENV_PATHS_PREFIX", unset = NA) if (!is.na(prefix)) return(prefix) auto <- Sys.getenv("RENV_PATHS_PREFIX_AUTO", unset = NA) if (auto %in% c("TRUE", "True", "true", "1")) return(renv_bootstrap_platform_prefix_auto()) "" } renv_bootstrap_platform_prefix_auto <- function() { prefix <- tryCatch(renv_bootstrap_platform_os(), error = identity) if (inherits(prefix, "error") || prefix %in% "unknown") { msg <- paste("failed to infer current operating system", "please file a bug report at https://github.com/rstudio/renv/issues", sep = "; ") warning(msg) } prefix } renv_bootstrap_platform_os <- function() { sysinfo <- Sys.info() sysname <- sysinfo[["sysname"]] if (sysname == "Windows") return("windows") else if (sysname == "Darwin") return("macos") for (file in c("/etc/os-release", "/usr/lib/os-release")) if (file.exists(file)) return(renv_bootstrap_platform_os_via_os_release(file, sysinfo)) if (file.exists("/etc/redhat-release")) return(renv_bootstrap_platform_os_via_redhat_release()) "unknown" } renv_bootstrap_platform_os_via_os_release <- function(file, sysinfo) { release <- utils::read.table(file = file, sep = "=", quote = c("\"", "'"), col.names = c("Key", "Value"), comment.char = "#", stringsAsFactors = FALSE) vars <- as.list(release$Value) names(vars) <- release$Key os <- tolower(sysinfo[["sysname"]]) id <- "unknown" for (field in c("ID", "ID_LIKE")) { if (field %in% names(vars) && nzchar(vars[[field]])) { id <- vars[[field]] break } } version <- "unknown" for (field in c("UBUNTU_CODENAME", "VERSION_CODENAME", "VERSION_ID", "BUILD_ID")) { if (field %in% names(vars) && nzchar(vars[[field]])) { version <- vars[[field]] break } } paste(c(os, id, version), collapse = "-") } renv_bootstrap_platform_os_via_redhat_release <- function() { contents <- readLines("/etc/redhat-release", warn = FALSE) id <- if (grepl("centos", contents, ignore.case = TRUE)) "centos" else if (grepl("redhat", contents, ignore.case = TRUE)) "redhat" else "unknown" version <- "unknown" parts <- strsplit(contents, "[[:space:]]")[[1L]] for (part in parts) { nv <- tryCatch(numeric_version(part), error = identity) if (inherits(nv, "error")) next version <- nv[1, 1] break } paste(c("linux", id, version), collapse = "-") } renv_bootstrap_library_root_name <- function(project) { asis <- Sys.getenv("RENV_PATHS_LIBRARY_ROOT_ASIS", unset = "FALSE") if (asis) return(basename(project)) id <- substring(renv_bootstrap_hash_text(project), 1L, 8L) paste(basename(project), id, sep = "-") } renv_bootstrap_library_root <- function(project) { prefix <- renv_bootstrap_profile_prefix() path <- Sys.getenv("RENV_PATHS_LIBRARY", unset = NA) if (!is.na(path)) return(paste(c(path, prefix), collapse = "/")) path <- renv_bootstrap_library_root_impl(project) if (!is.null(path)) { name <- renv_bootstrap_library_root_name(project) return(paste(c(path, prefix, name), collapse = "/")) } renv_bootstrap_paths_renv("library", project = project) } renv_bootstrap_library_root_impl <- function(project) { root <- Sys.getenv("RENV_PATHS_LIBRARY_ROOT", unset = NA) if (!is.na(root)) return(root) type <- renv_bootstrap_project_type(project) if (identical(type, "package")) { userdir <- renv_bootstrap_user_dir() return(file.path(userdir, "library")) } } renv_bootstrap_validate_version <- function(version, description = NULL) { description <- description %||% packageDescription("renv") sha <- attr(version, "sha", exact = TRUE) valid <- if (!is.null(sha)) renv_bootstrap_validate_version_dev(sha, description) else renv_bootstrap_validate_version_release(version, description) if (valid) return(TRUE) remote <- if (!is.null(description[["RemoteSha"]])) { paste("rstudio/renv", description[["RemoteSha"]], sep = "@") } else { paste("renv", description[["Version"]], sep = "@") } friendly <- renv_bootstrap_version_friendly(version = description[["Version"]], sha = description[["RemoteSha"]]) fmt <- paste("renv %1$s was loaded from project library, but this project is configured to use renv %2$s.", "- Use `renv::record(\"%3$s\")` to record renv %1$s in the lockfile.", "- Use `renv::restore(packages = \"renv\")` to install renv %2$s into the project library.", sep = "\n") catf(fmt, friendly, renv_bootstrap_version_friendly(version), remote) FALSE } renv_bootstrap_validate_version_dev <- function(version, description) { expected <- description[["RemoteSha"]] is.character(expected) && startswith(expected, version) } renv_bootstrap_validate_version_release <- function(version, description) { expected <- description[["Version"]] is.character(expected) && identical(expected, version) } renv_bootstrap_hash_text <- function(text) { hashfile <- tempfile("renv-hash-") on.exit(unlink(hashfile), add = TRUE) writeLines(text, con = hashfile) tools::md5sum(hashfile) } renv_bootstrap_load <- function(project, libpath, version) { if (!requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) return(FALSE) renv_bootstrap_validate_version(version) hooks <- getHook("renv::autoload") for (hook in hooks) if (is.function(hook)) tryCatch(hook(), error = warnify) renv::load(project) TRUE } renv_bootstrap_profile_load <- function(project) { profile <- Sys.getenv("RENV_PROFILE", unset = NA) if (!is.na(profile) && nzchar(profile)) return(profile) path <- renv_bootstrap_paths_renv("profile", profile = FALSE, project = project) if (!file.exists(path)) return(NULL) contents <- readLines(path, warn = FALSE) if (length(contents) == 0L) return(NULL) profile <- contents[[1L]] if (!profile %in% c("", "default")) Sys.setenv(RENV_PROFILE = profile) profile } renv_bootstrap_profile_prefix <- function() { profile <- renv_bootstrap_profile_get() if (!is.null(profile)) return(file.path("profiles", profile, "renv")) } renv_bootstrap_profile_get <- function() { profile <- Sys.getenv("RENV_PROFILE", unset = "") renv_bootstrap_profile_normalize(profile) } renv_bootstrap_profile_set <- function(profile) { profile <- renv_bootstrap_profile_normalize(profile) if (is.null(profile)) Sys.unsetenv("RENV_PROFILE") else Sys.setenv(RENV_PROFILE = profile) } renv_bootstrap_profile_normalize <- function(profile) { if (is.null(profile) || profile %in% c("", "default")) return(NULL) profile } renv_bootstrap_path_absolute <- function(path) { substr(path, 1L, 1L) %in% c("~", "/", "\\") || (substr(path, 1L, 1L) %in% c(letters, LETTERS) && substr(path, 2L, 3L) %in% c(":/", ":\\")) } renv_bootstrap_paths_renv <- function(..., profile = TRUE, project = NULL) { renv <- Sys.getenv("RENV_PATHS_RENV", unset = "renv") root <- if (renv_bootstrap_path_absolute(renv)) NULL else project prefix <- if (profile) renv_bootstrap_profile_prefix() components <- c(root, renv, prefix, ...) paste(components, collapse = "/") } renv_bootstrap_project_type <- function(path) { descpath <- file.path(path, "DESCRIPTION") if (!file.exists(descpath)) return("unknown") desc <- tryCatch(read.dcf(descpath, all = TRUE), error = identity) if (inherits(desc, "error")) return("unknown") type <- desc$Type if (!is.null(type)) return(tolower(type)) package <- desc$Package if (!is.null(package)) return("package") "unknown" } renv_bootstrap_user_dir <- function() { dir <- renv_bootstrap_user_dir_impl() path.expand(chartr("\\", "/", dir)) } renv_bootstrap_user_dir_impl <- function() { override <- getOption("renv.userdir.override") if (!is.null(override)) return(override) tools <- asNamespace("tools") if (is.function(tools$R_user_dir)) return(tools$R_user_dir("renv", "cache")) envvars <- c("R_USER_CACHE_DIR", "XDG_CACHE_HOME") for (envvar in envvars) { root <- Sys.getenv(envvar, unset = NA) if (!is.na(root)) return(file.path(root, "R/renv")) } if (Sys.info()[["sysname"]] == "Windows") file.path(Sys.getenv("LOCALAPPDATA"), "R/cache/R/renv") else if (Sys.info()[["sysname"]] == "Darwin") "~/Library/Caches/org.R-project.R/R/renv" else "~/.cache/R/renv" } renv_bootstrap_version_friendly <- function(version, shafmt = NULL, sha = NULL) { sha <- sha %||% attr(version, "sha", exact = TRUE) parts <- c(version, sprintf(shafmt %||% " [sha: %s]", substring(sha, 1L, 7L))) paste(parts, collapse = "") } renv_bootstrap_exec <- function(project, libpath, version) { if (!renv_bootstrap_load(project, libpath, version)) renv_bootstrap_run(version, libpath) } renv_bootstrap_run <- function(version, libpath) { bootstrap(version, libpath) if (!is.na(Sys.getenv("RENV_BOOTSTRAP_INSTALL_ONLY", unset = NA))) return(TRUE) if (requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) { return(renv::load(project = getwd())) } msg <- c("Failed to find an renv installation: the project will not be loaded.", "Use `renv::activate()` to re-initialize the project.") warning(paste(msg, collapse = "\n"), call. = FALSE) } renv_json_read <- function(file = NULL, text = NULL) { jlerr <- NULL if ("jsonlite" %in% loadedNamespaces()) { json <- catch(renv_json_read_jsonlite(file, text)) if (!inherits(json, "error")) return(json) jlerr <- json } json <- catch(renv_json_read_default(file, text)) if (!inherits(json, "error")) return(json) if (!is.null(jlerr)) stop(jlerr) else stop(json) } renv_json_read_jsonlite <- function(file = NULL, text = NULL) { text <- paste(text %||% read(file), collapse = "\n") jsonlite::fromJSON(txt = text, simplifyVector = FALSE) } renv_json_read_default <- function(file = NULL, text = NULL) { text <- paste(text %||% read(file), collapse = "\n") pattern <- "[\"](?:(?:\\\\.)|(?:[^\"\\\\]))*?[\"]" locs <- gregexpr(pattern, text, perl = TRUE)[[1]] replaced <- text strings <- character() replacements <- character() if (!identical(c(locs), -1L)) { starts <- locs ends <- locs + attr(locs, "match.length") - 1L strings <- substring(text, starts, ends) strings <- grep("[[\\]{}:]", strings, perl = TRUE, value = TRUE) replacements <- sprintf("\"\032%i\032\"", seq_along(strings)) mapply(function(string, replacement) { replaced <<- sub(string, replacement, replaced, fixed = TRUE) }, strings, replacements) } transformed <- replaced transformed <- gsub("{}", "`names<-`(list(), character())", transformed, fixed = TRUE) transformed <- gsub("[[{]", "list(", transformed, perl = TRUE) transformed <- gsub("[]}]", ")", transformed, perl = TRUE) transformed <- gsub(":", "=", transformed, fixed = TRUE) text <- paste(transformed, collapse = "\n") json <- parse(text = text, keep.source = FALSE, srcfile = NULL)[[1L]] map <- as.character(parse(text = strings)) names(map) <- as.character(parse(text = replacements)) map <- as.list(map) remapped <- renv_json_remap(json, map) eval(remapped, envir = baseenv()) } renv_json_remap <- function(json, map) { if (!is.null(names(json))) { lhs <- match(names(json), names(map), nomatch = 0L) rhs <- match(names(map), names(json), nomatch = 0L) names(json)[rhs] <- map[lhs] } if (is.character(json)) return(map[[json]] %||% json) if (is.name(json)) { text <- as.character(json) if (text == "true") return(TRUE) else if (text == "false") return(FALSE) else if (text == "null") return(NULL) } if (is.recursive(json)) { for (i in seq_along(json)) { json[i] <- list(renv_json_remap(json[[i]], map)) } } json } renv_bootstrap_profile_load(project) root <- renv_bootstrap_library_root(project) prefix <- renv_bootstrap_platform_prefix() libpath <- file.path(root, prefix) renv_bootstrap_exec(project, libpath, version) invisible()}), new.env())
45: eval(expr, p)
46: eval(expr, p)
47: eval.parent(substitute(eval(quote(expr), envir)))
48: local({ version <- "1.0.3.9000" attr(version, "sha") <- NULL project <- getwd() diagnostics <- Sys.getenv("RENV_STARTUP_DIAGNOSTICS", unset = "FALSE") if (diagnostics) { start <- Sys.time() profile <- tempfile("renv-startup-", fileext = ".Rprof") utils::Rprof(profile) on.exit({ utils::Rprof(NULL) elapsed <- signif(difftime(Sys.time(), start, units = "auto"), digits = 2L) writeLines(sprintf("- renv took %s to run the autoloader.", format(elapsed))) writeLines(sprintf("- Profile: %s", profile)) print(utils::summaryRprof(profile)) }, add = TRUE) } enabled <- local({ override <- getOption("renv.config.autoloader.enabled") if (!is.null(override)) return(override) envvars <- c("RENV_CONFIG_AUTOLOADER_ENABLED", "RENV_AUTOLOADER_ENABLED", "RENV_ACTIVATE_PROJECT") for (envvar in envvars) { envval <- Sys.getenv(envvar, unset = NA) if (!is.na(envval)) return(tolower(envval) %in% c("true", "t", "1")) } TRUE }) if (!enabled) return(FALSE) if (identical(getOption("renv.autoloader.running"), TRUE)) { warning("ignoring recursive attempt to run renv autoloader") return(invisible(TRUE)) } options(renv.autoloader.running = TRUE) on.exit(options(renv.autoloader.running = NULL), add = TRUE) options(renv.consent = TRUE) library(utils, lib.loc = .Library) if ("renv" %in% loadedNamespaces()) unloadNamespace("renv") `%||%` <- function(x, y) { if (is.null(x)) y else x } catf <- function(fmt, ..., appendLF = TRUE) { quiet <- getOption("renv.bootstrap.quiet", default = FALSE) if (quiet) return(invisible()) msg <- sprintf(fmt, ...) cat(msg, file = stdout(), sep = if (appendLF) "\n" else "") invisible(msg) } header <- function(label, ..., prefix = "#", suffix = "-", n = min(getOption("width"), 78)) { label <- sprintf(label, ...) n <- max(n - nchar(label) - nchar(prefix) - 2L, 8L) if (n <= 0) return(paste(prefix, label)) tail <- paste(rep.int(suffix, n), collapse = "") paste0(prefix, " ", label, " ", tail) } startswith <- function(string, prefix) { substring(string, 1, nchar(prefix)) == prefix } bootstrap <- function(version, library) { friendly <- renv_bootstrap_version_friendly(version) section <- header(sprintf("Bootstrapping renv %s", friendly)) catf(section) catf("- Downloading renv ... ", appendLF = FALSE) withCallingHandlers(tarball <- renv_bootstrap_download(version), error = function(err) { catf("FAILED") stop("failed to download:\n", conditionMessage(err)) }) catf("OK") on.exit(unlink(tarball), add = TRUE) catf("- Installing renv ... ", appendLF = FALSE) withCallingHandlers(status <- renv_bootstrap_install(version, tarball, library), error = function(err) { catf("FAILED") stop("failed to install:\n", conditionMessage(err)) }) catf("OK") catf("") return(invisible()) } renv_bootstrap_tests_running <- function() { getOption("renv.tests.running", default = FALSE) } renv_bootstrap_repos <- function() { cran <- getOption("renv.repos.cran", "https://cloud.r-project.org") repos <- Sys.getenv("RENV_CONFIG_REPOS_OVERRIDE", unset = NA) if (!is.na(repos)) { rspm <- Sys.getenv("RSPM", unset = NA) if (identical(rspm, repos)) repos <- c(RSPM = rspm, CRAN = cran) return(repos) } repos <- tryCatch(renv_bootstrap_repos_lockfile(), error = identity) if (!inherits(repos, "error") && length(repos)) return(repos) repos <- getOption("repos") repos[repos == "@CRAN@"] <- cran default <- c(FALLBACK = "https://cloud.r-project.org") extra <- getOption("renv.bootstrap.repos", default = default) repos <- c(repos, extra) dupes <- duplicated(repos) | duplicated(names(repos)) repos[!dupes] } renv_bootstrap_repos_lockfile <- function() { lockpath <- Sys.getenv("RENV_PATHS_LOCKFILE", unset = "renv.lock") if (!file.exists(lockpath)) return(NULL) lockfile <- tryCatch(renv_json_read(lockpath), error = identity) if (inherits(lockfile, "error")) { warning(lockfile) return(NULL) } repos <- lockfile$R$Repositories if (length(repos) == 0) return(NULL) keys <- vapply(repos, `[[`, "Name", FUN.VALUE = character(1)) vals <- vapply(repos, `[[`, "URL", FUN.VALUE = character(1)) names(vals) <- keys return(vals) } renv_bootstrap_download <- function(version) { sha <- attr(version, "sha", exact = TRUE) methods <- if (!is.null(sha)) { c(function() renv_bootstrap_download_tarball(sha), function() renv_bootstrap_download_github(sha)) } else { c(function() renv_bootstrap_download_tarball(version), function() renv_bootstrap_download_cran_latest(version), function() renv_bootstrap_download_cran_archive(version)) } for (method in methods) { path <- tryCatch(method(), error = identity) if (is.character(path) && file.exists(path)) return(path) } stop("All download methods failed") } renv_bootstrap_download_impl <- function(url, destfile) { mode <- "wb" fixup <- Sys.info()[["sysname"]] == "Windows" && substring(url, 1L, 5L) == "file:" if (fixup) mode <- "w+b" args <- list(url = url, destfile = destfile, mode = mode, quiet = TRUE) if ("headers" %in% names(formals(utils::download.file))) args$headers <- renv_bootstrap_download_custom_headers(url) do.call(utils::download.file, args) } renv_bootstrap_download_custom_headers <- function(url) { headers <- getOption("renv.download.headers") if (is.null(headers)) return(character()) if (!is.function(headers)) stopf("'renv.download.headers' is not a function") headers <- headers(url) if (length(headers) == 0L) return(character()) if (is.list(headers)) headers <- unlist(headers, recursive = FALSE, use.names = TRUE) ok <- is.character(headers) && is.character(names(headers)) && all(nzchar(names(headers))) if (!ok) stop("invocation of 'renv.download.headers' did not return a named character vector") headers } renv_bootstrap_download_cran_latest <- function(version) { spec <- renv_bootstrap_download_cran_latest_find(version) type <- spec$type repos <- spec$repos baseurl <- utils::contrib.url(repos = repos, type = type) ext <- if (identical(type, "source")) ".tar.gz" else if (Sys.info()[["sysname"]] == "Windows") ".zip" else ".tgz" name <- sprintf("renv_%s%s", version, ext) url <- paste(baseurl, name, sep = "/") destfile <- file.path(tempdir(), name) status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (inherits(status, "condition")) return(FALSE) destfile } renv_bootstrap_download_cran_latest_find <- function(version) { binary <- getOption("renv.bootstrap.binary", default = TRUE) && !identical(.Platform$pkgType, "source") && !identical(getOption("pkgType"), "source") && Sys.info()[["sysname"]] %in% c("Darwin", "Windows") types <- c(if (binary) "binary", "source") for (type in types) { for (repos in renv_bootstrap_repos()) { db <- tryCatch(as.data.frame(utils::available.packages(type = type, repos = repos), stringsAsFactors = FALSE), error = identity) if (inherits(db, "error")) next entry <- db[db$Package %in% "renv" & db$Version %in% version, ] if (nrow(entry) == 0) next spec <- list(entry = entry, type = type, repos = repos) return(spec) } } fmt <- "renv %s is not available from your declared package repositories" stop(sprintf(fmt, version)) } renv_bootstrap_download_cran_archive <- function(version) { name <- sprintf("renv_%s.tar.gz", version) repos <- renv_bootstrap_repos() urls <- file.path(repos, "src/contrib/Archive/renv", name) destfile <- file.path(tempdir(), name) for (url in urls) { status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (identical(status, 0L)) return(destfile) } return(FALSE) } renv_bootstrap_download_tarball <- function(version) { tarball <- Sys.getenv("RENV_BOOTSTRAP_TARBALL", unset = NA) if (is.na(tarball)) return() if (dir.exists(tarball)) { name <- sprintf("renv_%s.tar.gz", version) tarball <- file.path(tarball, name) } if (!file.exists(tarball)) { fmt <- "- RENV_BOOTSTRAP_TARBALL is set (%s) but does not exist." msg <- sprintf(fmt, tarball) warning(msg) return() } catf("- Using local tarball '%s'.", tarball) tarball } renv_bootstrap_download_github <- function(version) { enabled <- Sys.getenv("RENV_BOOTSTRAP_FROM_GITHUB", unset = "TRUE") if (!identical(enabled, "TRUE")) return(FALSE) pat <- Sys.getenv("GITHUB_PAT") if (nzchar(Sys.which("curl")) && nzchar(pat)) { fmt <- "--location --fail --header \"Authorization: token %s\"" extra <- sprintf(fmt, pat) saved <- options("download.file.method", "download.file.extra") options(download.file.method = "curl", download.file.extra = extra) on.exit(do.call(base::options, saved), add = TRUE) } else if (nzchar(Sys.which("wget")) && nzchar(pat)) { fmt <- "--header=\"Authorization: token %s\"" extra <- sprintf(fmt, pat) saved <- options("download.file.method", "download.file.extra") options(download.file.method = "wget", download.file.extra = extra) on.exit(do.call(base::options, saved), add = TRUE) } url <- file.path("https://api.github.com/repos/rstudio/renv/tarball", version) name <- sprintf("renv_%s.tar.gz", version) destfile <- file.path(tempdir(), name) status <- tryCatch(renv_bootstrap_download_impl(url, destfile), condition = identity) if (!identical(status, 0L)) return(FALSE) renv_bootstrap_download_augment(destfile) return(destfile) } renv_bootstrap_download_augment <- function(destfile) { sha <- renv_bootstrap_git_extract_sha1_tar(destfile) if (is.null(sha)) { return() } tempdir <- tempfile("renv-github-") on.exit(unlink(tempdir, recursive = TRUE), add = TRUE) untar(destfile, exdir = tempdir) pkgdir <- dir(tempdir, full.names = TRUE)[[1]] desc_path <- file.path(pkgdir, "DESCRIPTION") desc_lines <- readLines(desc_path) remotes_fields <- c("RemoteType: github", "RemoteHost: api.github.com", "RemoteRepo: renv", "RemoteUsername: rstudio", "RemotePkgRef: rstudio/renv", paste("RemoteRef: ", sha), paste("RemoteSha: ", sha)) writeLines(c(desc_lines[desc_lines != ""], remotes_fields), con = desc_path) local({ old <- setwd(tempdir) on.exit(setwd(old), add = TRUE) tar(destfile, compression = "gzip") }) invisible() } renv_bootstrap_git_extract_sha1_tar <- function(bundle) { conn <- gzcon(file(bundle, open = "rb", raw = TRUE)) on.exit(close(conn)) len <- 512 + 51 res <- rawToChar(readBin(conn, "raw", n = len)[513:len]) if (grepl("^52 comment=", res)) { sub("52 comment=", "", res) } else { NULL } } renv_bootstrap_install <- function(version, tarball, library) { dir.create(library, showWarnings = FALSE, recursive = TRUE) output <- renv_bootstrap_install_impl(library, tarball) status <- attr(output, "status") if (is.null(status) || identical(status, 0L)) return(status) header <- "installation of renv failed" lines <- paste(rep.int("=", nchar(header)), collapse = "") text <- paste(c(header, lines, output), collapse = "\n") stop(text) } renv_bootstrap_install_impl <- function(library, tarball) { bin <- R.home("bin") exe <- if (Sys.info()[["sysname"]] == "Windows") "R.exe" else "R" R <- file.path(bin, exe) args <- c("--vanilla", "CMD", "INSTALL", "--no-multiarch", "-l", shQuote(path.expand(library)), shQuote(path.expand(tarball))) system2(R, args, stdout = TRUE, stderr = TRUE) } renv_bootstrap_platform_prefix <- function() { version <- paste(R.version$major, R.version$minor, sep = ".") prefix <- paste("R", numeric_version(version)[1, 1:2], sep = "-") devel <- identical(R.version[["status"]], "Under development (unstable)") || identical(R.version[["nickname"]], "Unsuffered Consequences") if (devel) prefix <- paste(prefix, R.version[["svn rev"]], sep = "-r") components <- c(prefix, R.version$platform) prefix <- renv_bootstrap_platform_prefix_impl() if (!is.na(prefix) && nzchar(prefix)) components <- c(prefix, components) paste(components, collapse = "/") } renv_bootstrap_platform_prefix_impl <- function() { prefix <- Sys.getenv("RENV_PATHS_PREFIX", unset = NA) if (!is.na(prefix)) return(prefix) auto <- Sys.getenv("RENV_PATHS_PREFIX_AUTO", unset = NA) if (auto %in% c("TRUE", "True", "true", "1")) return(renv_bootstrap_platform_prefix_auto()) "" } renv_bootstrap_platform_prefix_auto <- function() { prefix <- tryCatch(renv_bootstrap_platform_os(), error = identity) if (inherits(prefix, "error") || prefix %in% "unknown") { msg <- paste("failed to infer current operating system", "please file a bug report at https://github.com/rstudio/renv/issues", sep = "; ") warning(msg) } prefix } renv_bootstrap_platform_os <- function() { sysinfo <- Sys.info() sysname <- sysinfo[["sysname"]] if (sysname == "Windows") return("windows") else if (sysname == "Darwin") return("macos") for (file in c("/etc/os-release", "/usr/lib/os-release")) if (file.exists(file)) return(renv_bootstrap_platform_os_via_os_release(file, sysinfo)) if (file.exists("/etc/redhat-release")) return(renv_bootstrap_platform_os_via_redhat_release()) "unknown" } renv_bootstrap_platform_os_via_os_release <- function(file, sysinfo) { release <- utils::read.table(file = file, sep = "=", quote = c("\"", "'"), col.names = c("Key", "Value"), comment.char = "#", stringsAsFactors = FALSE) vars <- as.list(release$Value) names(vars) <- release$Key os <- tolower(sysinfo[["sysname"]]) id <- "unknown" for (field in c("ID", "ID_LIKE")) { if (field %in% names(vars) && nzchar(vars[[field]])) { id <- vars[[field]] break } } version <- "unknown" for (field in c("UBUNTU_CODENAME", "VERSION_CODENAME", "VERSION_ID", "BUILD_ID")) { if (field %in% names(vars) && nzchar(vars[[field]])) { version <- vars[[field]] break } } paste(c(os, id, version), collapse = "-") } renv_bootstrap_platform_os_via_redhat_release <- function() { contents <- readLines("/etc/redhat-release", warn = FALSE) id <- if (grepl("centos", contents, ignore.case = TRUE)) "centos" else if (grepl("redhat", contents, ignore.case = TRUE)) "redhat" else "unknown" version <- "unknown" parts <- strsplit(contents, "[[:space:]]")[[1L]] for (part in parts) { nv <- tryCatch(numeric_version(part), error = identity) if (inherits(nv, "error")) next version <- nv[1, 1] break } paste(c("linux", id, version), collapse = "-") } renv_bootstrap_library_root_name <- function(project) { asis <- Sys.getenv("RENV_PATHS_LIBRARY_ROOT_ASIS", unset = "FALSE") if (asis) return(basename(project)) id <- substring(renv_bootstrap_hash_text(project), 1L, 8L) paste(basename(project), id, sep = "-") } renv_bootstrap_library_root <- function(project) { prefix <- renv_bootstrap_profile_prefix() path <- Sys.getenv("RENV_PATHS_LIBRARY", unset = NA) if (!is.na(path)) return(paste(c(path, prefix), collapse = "/")) path <- renv_bootstrap_library_root_impl(project) if (!is.null(path)) { name <- renv_bootstrap_library_root_name(project) return(paste(c(path, prefix, name), collapse = "/")) } renv_bootstrap_paths_renv("library", project = project) } renv_bootstrap_library_root_impl <- function(project) { root <- Sys.getenv("RENV_PATHS_LIBRARY_ROOT", unset = NA) if (!is.na(root)) return(root) type <- renv_bootstrap_project_type(project) if (identical(type, "package")) { userdir <- renv_bootstrap_user_dir() return(file.path(userdir, "library")) } } renv_bootstrap_validate_version <- function(version, description = NULL) { description <- description %||% packageDescription("renv") sha <- attr(version, "sha", exact = TRUE) valid <- if (!is.null(sha)) renv_bootstrap_validate_version_dev(sha, description) else renv_bootstrap_validate_version_release(version, description) if (valid) return(TRUE) remote <- if (!is.null(description[["RemoteSha"]])) { paste("rstudio/renv", description[["RemoteSha"]], sep = "@") } else { paste("renv", description[["Version"]], sep = "@") } friendly <- renv_bootstrap_version_friendly(version = description[["Version"]], sha = description[["RemoteSha"]]) fmt <- paste("renv %1$s was loaded from project library, but this project is configured to use renv %2$s.", "- Use `renv::record(\"%3$s\")` to record renv %1$s in the lockfile.", "- Use `renv::restore(packages = \"renv\")` to install renv %2$s into the project library.", sep = "\n") catf(fmt, friendly, renv_bootstrap_version_friendly(version), remote) FALSE } renv_bootstrap_validate_version_dev <- function(version, description) { expected <- description[["RemoteSha"]] is.character(expected) && startswith(expected, version) } renv_bootstrap_validate_version_release <- function(version, description) { expected <- description[["Version"]] is.character(expected) && identical(expected, version) } renv_bootstrap_hash_text <- function(text) { hashfile <- tempfile("renv-hash-") on.exit(unlink(hashfile), add = TRUE) writeLines(text, con = hashfile) tools::md5sum(hashfile) } renv_bootstrap_load <- function(project, libpath, version) { if (!requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) return(FALSE) renv_bootstrap_validate_version(version) hooks <- getHook("renv::autoload") for (hook in hooks) if (is.function(hook)) tryCatch(hook(), error = warnify) renv::load(project) TRUE } renv_bootstrap_profile_load <- function(project) { profile <- Sys.getenv("RENV_PROFILE", unset = NA) if (!is.na(profile) && nzchar(profile)) return(profile) path <- renv_bootstrap_paths_renv("profile", profile = FALSE, project = project) if (!file.exists(path)) return(NULL) contents <- readLines(path, warn = FALSE) if (length(contents) == 0L) return(NULL) profile <- contents[[1L]] if (!profile %in% c("", "default")) Sys.setenv(RENV_PROFILE = profile) profile } renv_bootstrap_profile_prefix <- function() { profile <- renv_bootstrap_profile_get() if (!is.null(profile)) return(file.path("profiles", profile, "renv")) } renv_bootstrap_profile_get <- function() { profile <- Sys.getenv("RENV_PROFILE", unset = "") renv_bootstrap_profile_normalize(profile) } renv_bootstrap_profile_set <- function(profile) { profile <- renv_bootstrap_profile_normalize(profile) if (is.null(profile)) Sys.unsetenv("RENV_PROFILE") else Sys.setenv(RENV_PROFILE = profile) } renv_bootstrap_profile_normalize <- function(profile) { if (is.null(profile) || profile %in% c("", "default")) return(NULL) profile } renv_bootstrap_path_absolute <- function(path) { substr(path, 1L, 1L) %in% c("~", "/", "\\") || (substr(path, 1L, 1L) %in% c(letters, LETTERS) && substr(path, 2L, 3L) %in% c(":/", ":\\")) } renv_bootstrap_paths_renv <- function(..., profile = TRUE, project = NULL) { renv <- Sys.getenv("RENV_PATHS_RENV", unset = "renv") root <- if (renv_bootstrap_path_absolute(renv)) NULL else project prefix <- if (profile) renv_bootstrap_profile_prefix() components <- c(root, renv, prefix, ...) paste(components, collapse = "/") } renv_bootstrap_project_type <- function(path) { descpath <- file.path(path, "DESCRIPTION") if (!file.exists(descpath)) return("unknown") desc <- tryCatch(read.dcf(descpath, all = TRUE), error = identity) if (inherits(desc, "error")) return("unknown") type <- desc$Type if (!is.null(type)) return(tolower(type)) package <- desc$Package if (!is.null(package)) return("package") "unknown" } renv_bootstrap_user_dir <- function() { dir <- renv_bootstrap_user_dir_impl() path.expand(chartr("\\", "/", dir)) } renv_bootstrap_user_dir_impl <- function() { override <- getOption("renv.userdir.override") if (!is.null(override)) return(override) tools <- asNamespace("tools") if (is.function(tools$R_user_dir)) return(tools$R_user_dir("renv", "cache")) envvars <- c("R_USER_CACHE_DIR", "XDG_CACHE_HOME") for (envvar in envvars) { root <- Sys.getenv(envvar, unset = NA) if (!is.na(root)) return(file.path(root, "R/renv")) } if (Sys.info()[["sysname"]] == "Windows") file.path(Sys.getenv("LOCALAPPDATA"), "R/cache/R/renv") else if (Sys.info()[["sysname"]] == "Darwin") "~/Library/Caches/org.R-project.R/R/renv" else "~/.cache/R/renv" } renv_bootstrap_version_friendly <- function(version, shafmt = NULL, sha = NULL) { sha <- sha %||% attr(version, "sha", exact = TRUE) parts <- c(version, sprintf(shafmt %||% " [sha: %s]", substring(sha, 1L, 7L))) paste(parts, collapse = "") } renv_bootstrap_exec <- function(project, libpath, version) { if (!renv_bootstrap_load(project, libpath, version)) renv_bootstrap_run(version, libpath) } renv_bootstrap_run <- function(version, libpath) { bootstrap(version, libpath) if (!is.na(Sys.getenv("RENV_BOOTSTRAP_INSTALL_ONLY", unset = NA))) return(TRUE) if (requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) { return(renv::load(project = getwd())) } msg <- c("Failed to find an renv installation: the project will not be loaded.", "Use `renv::activate()` to re-initialize the project.") warning(paste(msg, collapse = "\n"), call. = FALSE) } renv_json_read <- function(file = NULL, text = NULL) { jlerr <- NULL if ("jsonlite" %in% loadedNamespaces()) { json <- catch(renv_json_read_jsonlite(file, text)) if (!inherits(json, "error")) return(json) jlerr <- json } json <- catch(renv_json_read_default(file, text)) if (!inherits(json, "error")) return(json) if (!is.null(jlerr)) stop(jlerr) else stop(json) } renv_json_read_jsonlite <- function(file = NULL, text = NULL) { text <- paste(text %||% read(file), collapse = "\n") jsonlite::fromJSON(txt = text, simplifyVector = FALSE) } renv_json_read_default <- function(file = NULL, text = NULL) { text <- paste(text %||% read(file), collapse = "\n") pattern <- "[\"](?:(?:\\\\.)|(?:[^\"\\\\]))*?[\"]" locs <- gregexpr(pattern, text, perl = TRUE)[[1]] replaced <- text strings <- character() replacements <- character() if (!identical(c(locs), -1L)) { starts <- locs ends <- locs + attr(locs, "match.length") - 1L strings <- substring(text, starts, ends) strings <- grep("[[\\]{}:]", strings, perl = TRUE, value = TRUE) replacements <- sprintf("\"\032%i\032\"", seq_along(strings)) mapply(function(string, replacement) { replaced <<- sub(string, replacement, replaced, fixed = TRUE) }, strings, replacements) } transformed <- replaced transformed <- gsub("{}", "`names<-`(list(), character())", transformed, fixed = TRUE) transformed <- gsub("[[{]", "list(", transformed, perl = TRUE) transformed <- gsub("[]}]", ")", transformed, perl = TRUE) transformed <- gsub(":", "=", transformed, fixed = TRUE) text <- paste(transformed, collapse = "\n") json <- parse(text = text, keep.source = FALSE, srcfile = NULL)[[1L]] map <- as.character(parse(text = strings)) names(map) <- as.character(parse(text = replacements)) map <- as.list(map) remapped <- renv_json_remap(json, map) eval(remapped, envir = baseenv()) } renv_json_remap <- function(json, map) { if (!is.null(names(json))) { lhs <- match(names(json), names(map), nomatch = 0L) rhs <- match(names(map), names(json), nomatch = 0L) names(json)[rhs] <- map[lhs] } if (is.character(json)) return(map[[json]] %||% json) if (is.name(json)) { text <- as.character(json) if (text == "true") return(TRUE) else if (text == "false") return(FALSE) else if (text == "null") return(NULL) } if (is.recursive(json)) { for (i in seq_along(json)) { json[i] <- list(renv_json_remap(json[[i]], map)) } } json } renv_bootstrap_profile_load(project) root <- renv_bootstrap_library_root(project) prefix <- renv_bootstrap_platform_prefix() libpath <- file.path(root, prefix) renv_bootstrap_exec(project, libpath, version) invisible()})
49: eval(ei, envir)
50: eval(ei, envir)
51: withVisible(eval(ei, envir))
52: source("renv/activate.R")
53: eval(ei, envir)
54: eval(ei, envir)
55: withVisible(eval(ei, envir))
56: source(file)
57: try_source(".Rprofile")
58: eval(quote({ try_source <- function(file) { if (file.exists(file)) { source(file) TRUE } else { FALSE } } r_profile <- Sys.getenv("R_PROFILE_USER_OLD") Sys.setenv(R_PROFILE_USER_OLD = "", R_PROFILE_USER = r_profile) if (nzchar(r_profile)) { try_source(r_profile) } else { try_source(".Rprofile") || try_source(file.path("~", ".Rprofile")) } invisible()}), new.env())
59: eval(quote({ try_source <- function(file) { if (file.exists(file)) { source(file) TRUE } else { FALSE } } r_profile <- Sys.getenv("R_PROFILE_USER_OLD") Sys.setenv(R_PROFILE_USER_OLD = "", R_PROFILE_USER = r_profile) if (nzchar(r_profile)) { try_source(r_profile) } else { try_source(".Rprofile") || try_source(file.path("~", ".Rprofile")) } invisible()}), new.env())
60: eval(expr, p)
61: eval(expr, p)
62: eval.parent(substitute(eval(quote(expr), envir)))
63: local({ try_source <- function(file) { if (file.exists(file)) { source(file) TRUE } else { FALSE } } r_profile <- Sys.getenv("R_PROFILE_USER_OLD") Sys.setenv(R_PROFILE_USER_OLD = "", R_PROFILE_USER = r_profile) if (nzchar(r_profile)) { try_source(r_profile) } else { try_source(".Rprofile") || try_source(file.path("~", ".Rprofile")) } invisible()})
Possible actions:
1: abort (with core dump, if enabled)
2: normal R exit
3: exit R without saving workspace
4: exit R saving workspace
Selection:
Whereas calling R works as expected.
> R
R version 4.3.1 (2023-06-16) -- "Beagle Scouts"
Copyright (C) 2023 The R Foundation for Statistical Computing
Platform: aarch64-apple-darwin20 (64-bit)
R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.
Natural language support but running in an English locale
R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.
Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.
- Project '~/project' loaded. [renv 1.0.3.9000; sha: 63f3073]
Renv disabled works fine as well.
> radian
R version 4.3.1 (2023-06-16) -- "Beagle Scouts"
Platform: aarch64-apple-darwin20 (64-bit)
Just wanted to say I can replicate this bug. I also managed to track down the source of the problem.
renv determines which "user profile" to load by running:
profile <- Sys.getenv("R_PROFILE_USER", unset = "~/.Rprofile")
Key bit is the variable needs to be unset for it to default to ~/.Rprofile. However in the vscodeR session Rprofile file we have:
r_profile <- Sys.getenv("R_PROFILE_USER_OLD")
Sys.setenv(
R_PROFILE_USER_OLD = "",
R_PROFILE_USER = r_profile
)
If the variable is originally unset it is being replaced by "" thus is no longer regarded as being unset and thus renv doesn't resolve the variable to the default path.
A simple workaround solution (until this is fixed) is to just add R_PROFILE_USER=~/.Rprofile to your .Renviron file.
Just wanted to say I can replicate this bug. I also managed to track down the source of the problem.
renvdetermines which "user profile" to load by running:profile <- Sys.getenv("R_PROFILE_USER", unset = "~/.Rprofile")Key bit is the variable needs to be unset for it to default to
~/.Rprofile. However in the vscodeR session Rprofile file we have:r_profile <- Sys.getenv("R_PROFILE_USER_OLD") Sys.setenv( R_PROFILE_USER_OLD = "", R_PROFILE_USER = r_profile )If the variable is originally unset it is being replaced by
""thus is no longer regarded as being unset and thus renv doesn't resolve the variable to the default path.A simple workaround solution (until this is fixed) is to just add
R_PROFILE_USER=~/.Rprofileto your.Renvironfile.
Unfortunately, that does not seem to work for me. I can't even use R in a non-renv environment.
@eyayaw - Looking at your log I think you have a different issue to the one reported in the OP though I'm not really sure whats actually going wrong sorry :(
Potentially it could be a radian issue? - I would create another ticket though so it doesn't get lost as I think the fix for the issue in the OP is not that difficult to address.
@gowerc Thank you. I raised a new issue here: #439