Skip to content

Commit b6300f3

Browse files
committed
More robust setInternet2 workaround
1 parent cc0b5e5 commit b6300f3

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/shiny.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -733,7 +733,7 @@ download <- function(url, ...) {
733733
# If Windows, call setInternet2, then use download.file with defaults.
734734
if (.Platform$OS.type == "windows") {
735735
# If we directly use setInternet2, R CMD CHECK gives a Note on Mac/Linux
736-
mySI2 <- eval(parse(text="setInternet2"))
736+
mySI2 <- `::`(utils, 'setInternet2')
737737
# Store initial settings
738738
internet2_start <- mySI2(NA)
739739
on.exit(mySI2(internet2_start))

0 commit comments

Comments
 (0)