Skip to content

Commit d9022f8

Browse files
committed
clean up .onLoad()
.onLoad() seemed to be setting dplyr.show_progress in a users options which didn't seem neccessary. This removes that and maintains current logic (although AFAICT progress bars have been deprecated anyway).
1 parent be36acf commit d9022f8

File tree

2 files changed

+1
-8
lines changed

2 files changed

+1
-8
lines changed

R/progress.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -100,7 +100,7 @@ Progress <- R6::R6Class("Progress",
100100
},
101101

102102
print = function(...) {
103-
if (!isTRUE(getOption("dplyr.show_progress")) || # user specifies no progress
103+
if (isFALSE(getOption("dplyr.show_progress")) || # user specifies no progress
104104
!interactive() || # not an interactive session
105105
!is.null(getOption("knitr.in.progress"))) { # dplyr used within knitr document
106106
return(invisible(self))

R/zzz.R

Lines changed: 0 additions & 7 deletions
Original file line numberDiff line numberDiff line change
@@ -1,13 +1,6 @@
11
.onLoad <- function(libname, pkgname) {
22
ns_dplyr <- ns_env(pkgname)
33

4-
op <- options()
5-
op.dplyr <- list(
6-
dplyr.show_progress = TRUE
7-
)
8-
toset <- !(names(op.dplyr) %in% names(op))
9-
if (any(toset)) options(op.dplyr[toset])
10-
114
.Call(dplyr_init_library, ns_dplyr, ns_env("vctrs"), ns_env("rlang"))
125

136
# TODO: For `arrange()`, `group_by()`, `with_order()`, and `nth()` until vctrs

0 commit comments

Comments
 (0)