Skip to content

Commit

Permalink
also export deactivate
Browse files Browse the repository at this point in the history
  • Loading branch information
lorenzwalthert committed Aug 16, 2019
1 parent 138bb8c commit 320ec21
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 0 deletions.
1 change: 1 addition & 0 deletions API
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@

cache_activate(cache_name = NULL)
cache_clear(cache_name = NULL, ask = TRUE)
cache_deactivate()
cache_info(cache_name = NULL, format = "lucid")
create_style_guide(initialize = default_style_guide_attributes, line_break = NULL, space = NULL, token = NULL, indention = NULL, use_raw_indention = FALSE, reindention = tidyverse_reindention())
default_style_guide_attributes(pd_flat)
Expand Down
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -3,6 +3,7 @@
S3method(print,vertical)
export(cache_activate)
export(cache_clear)
export(cache_deactivate)
export(cache_info)
export(create_style_guide)
export(default_style_guide_attributes)
Expand Down
1 change: 1 addition & 0 deletions R/ui.R
Original file line number Diff line number Diff line change
Expand Up @@ -319,6 +319,7 @@ cache_activate <- function(cache_name = NULL) {
}

#' @rdname cache_activate
#' @export
cache_deactivate <- function() {
options("styler.use_cache" = FALSE)
options("styler.cache_name" = NULL)
Expand Down

0 comments on commit 320ec21

Please sign in to comment.