Skip to content

Commit

Permalink
chore: code style
Browse files Browse the repository at this point in the history
  • Loading branch information
gadenbuie committed Feb 21, 2025
1 parent da9ca3c commit 3371f40
Showing 1 changed file with 4 additions and 1 deletion.
5 changes: 4 additions & 1 deletion R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -797,8 +797,11 @@ cachedFuncWithFile <- function(dir, file, func, case.sensitive = FALSE) {
last_autoreload <- 0

function(...) {
fname <- if (case.sensitive) file.path(dir, file) else
fname <- if (case.sensitive) {
file.path(dir, file)
} else {
file.path.ci(dir, file)
}

now <- file.info(fname)$mtime
autoreload <- last_autoreload < cachedAutoReloadLastChanged$get()
Expand Down

0 comments on commit 3371f40

Please sign in to comment.