Skip to content

Commit 758e9fd

Browse files
committed
use R_user_dir() for cache root in new installs
1 parent b1062db commit 758e9fd

File tree

6 files changed

+102
-17
lines changed

6 files changed

+102
-17
lines changed

DESCRIPTION

+1-1
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
Package: renv
22
Type: Package
33
Title: Project Environments
4-
Version: 0.13.2-115
4+
Version: 0.13.2-116
55
Authors@R: c(
66
person("Kevin", "Ushey", role = c("aut", "cre"), email = "[email protected]"),
77
person("RStudio, PBC", role = c("cph"))

NEWS.md

+6
Original file line numberDiff line numberDiff line change
@@ -1,6 +1,12 @@
11

22
# renv 0.14.0 (UNRELEASED)
33

4+
* `renv` now uses `tools::R_user_dir()` to resolve the default path to the
5+
global `renv` cache, for R installations 4.0.0 or greater. If the `renv`
6+
cache still exists at the old location, that location will be used instead.
7+
This change should only affect brand new installations of `renv` on newer
8+
versions of `R`.
9+
410
* Fixed an issue with `renv` tests failing with R (>= 4.2.0).
511

612
* `renv` will no longer auto-activate itself within R processes launched via

R/consent.R

+2-2
Original file line numberDiff line numberDiff line change
@@ -40,7 +40,7 @@ consent <- function(provided = FALSE) {
4040

4141
template <- system.file("resources/WELCOME", package = "renv")
4242
contents <- readLines(template)
43-
replacements <- list(RENV_PATHS_ROOT = shQuote(aliased_path(root)))
43+
replacements <- list(RENV_PATHS_ROOT = renv_path_pretty(root))
4444
welcome <- renv_template_replace(contents, replacements)
4545
writeLines(welcome)
4646

@@ -52,7 +52,7 @@ consent <- function(provided = FALSE) {
5252

5353
options(renv.consent = TRUE)
5454
ensure_directory(root)
55-
vwritef("* %s has been created.", shQuote(aliased_path(root)))
55+
vwritef("* %s has been created.", renv_path_pretty(root))
5656

5757
return(invisible(TRUE))
5858

R/paths.R

+70-13
Original file line numberDiff line numberDiff line change
@@ -122,17 +122,10 @@ renv_paths_root_default <- function() {
122122
!is.na(Sys.getenv("TESTTHAT", unset = NA))
123123

124124
if (checking)
125-
return(renv_paths_root_default_impl())
125+
return(renv_paths_root_default_tempdir())
126126

127-
root <- switch(
128-
Sys.info()[["sysname"]],
129-
Darwin = Sys.getenv("XDG_DATA_HOME", "~/Library/Application Support"),
130-
Windows = Sys.getenv("LOCALAPPDATA", Sys.getenv("APPDATA")),
131-
Sys.getenv("XDG_DATA_HOME", "~/.local/share")
132-
)
133-
134-
root <- renv_path_normalize(root, winslash = "/", mustWork = FALSE)
135-
path <- file.path(root, "renv")
127+
# resolve path to cache
128+
path <- renv_paths_root_default_impl()
136129

137130
# check for user consent
138131
consenting <- identical(getOption("renv.consenting"), TRUE)
@@ -165,19 +158,70 @@ renv_paths_root_default <- function() {
165158
)
166159
}
167160

168-
renv_paths_root_default_impl()
161+
renv_paths_root_default_tempdir()
169162

170163
}
171164

172165
renv_paths_root_default_impl <- function() {
166+
167+
# support renv projects created with the old root location
168+
oldroot <- switch(
169+
Sys.info()[["sysname"]],
170+
Darwin = Sys.getenv("XDG_DATA_HOME", "~/Library/Application Support"),
171+
Windows = Sys.getenv("LOCALAPPDATA", Sys.getenv("APPDATA")),
172+
Sys.getenv("XDG_DATA_HOME", "~/.local/share")
173+
)
174+
175+
# if we've already initialized renv with the old location, use it
176+
oldpath <- file.path(oldroot, "renv")
177+
if (file.exists(oldpath))
178+
return(oldpath)
179+
180+
# try using tools to get the user directory
181+
tools <- asNamespace("tools")
182+
path <- catch(tools$R_user_dir("renv", which = "cache"))
183+
if (!inherits(path, "error"))
184+
return(path)
185+
186+
# try using our own backfill for older versions of R
187+
renv_paths_root_default_impl_fallback()
188+
189+
}
190+
191+
renv_paths_root_default_impl_fallback <- function() {
192+
193+
# check for R_USER_CACHE_DIR + XDG_CACHE_HOME overrides
194+
envvars <- c("R_USER_CACHE_DIR", "XDG_CACHE_HOME")
195+
for (envvar in envvars) {
196+
root <- Sys.getenv(envvar, unset = NA)
197+
if (!is.na(root)) {
198+
path <- file.path(root, "R/renv")
199+
return(path)
200+
}
201+
}
202+
203+
# use platform-specific default fallbacks
204+
if (renv_platform_windows())
205+
file.path(Sys.getenv("LOCALAPPDATA"), "R/cache/R/renv")
206+
else if (renv_platform_macos())
207+
"~/Library/Caches/org.R-project.R/R/renv"
208+
else
209+
"~/.cache/R/renv"
210+
211+
}
212+
213+
renv_paths_root_default_tempdir <- function() {
173214
temp <- file.path(tempdir(), "renv")
174215
ensure_directory(temp)
175216
return(temp)
176217
}
177-
178218
# nocov end
179219

180220
renv_paths_init <- function() {
221+
renv_paths_init_envvars()
222+
}
223+
224+
renv_paths_init_envvars <- function() {
181225

182226
envvars <- Sys.getenv()
183227

@@ -205,7 +249,20 @@ renv_paths_init <- function() {
205249
#' Windows \tab `%LOCALAPPDATA%/renv` \cr
206250
#' }
207251
#'
208-
#' If desired, this path can be adjusted by setting the `RENV_PATHS_ROOT`
252+
#' For new installations of `renv` using R (>= 4.0.0), `renv` will use
253+
#' [tools::R_user_dir()] to resolve the root directory. If an `renv` root
254+
#' directory has already been created in one of the old locations, that will
255+
#' still be used. This change was made to comply with the CRAN policy
256+
#' requirements of \R packages. By default, these paths resolve as:
257+
#'
258+
#' \tabular{ll}{
259+
#' **Platform** \tab **Location** \cr
260+
#' Linux \tab `~/.cache/R/renv` \cr
261+
#' macOS \tab `~/Library/Caches/org.R-project.R/R/renv` \cr
262+
#' Windows \tab `%LOCALAPPDATA%/R/cache/R/renv` \cr
263+
#' }
264+
#'
265+
#' If desired, this path can be customized by setting the `RENV_PATHS_ROOT`
209266
#' environment variable. This can be useful if you'd like, for example, multiple
210267
#' users to be able to share a single global cache.
211268
#'

man/paths.Rd

+14-1
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

tests/testthat/test-paths.R

+9
Original file line numberDiff line numberDiff line change
@@ -72,3 +72,12 @@ test_that("UTF-8 paths can be normalized", {
7272
expect_equal(expected, actual)
7373

7474
})
75+
76+
test_that("our fallback R_user_dir() implementation is compatible", {
77+
78+
skip_if(getRversion() < "4.0.0")
79+
actual <- renv_paths_root_default_impl_fallback()
80+
expected <- tools::R_user_dir("renv", which = "cache")
81+
expect_true(renv_path_same(actual, expected))
82+
83+
})

0 commit comments

Comments
 (0)