Skip to content

Commit 9766c02

Browse files
committed
do not expose fini at R level
1 parent 6cecf40 commit 9766c02

File tree

4 files changed

+10
-6
lines changed

4 files changed

+10
-6
lines changed

R/messenger.R

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -101,6 +101,8 @@ messenger <- function(url, auth = NULL) {
101101
cat(sprintf("%*s > %s\n", nchar(data), "", format.POSIXct(Sys.time())), file = stdout())
102102
}
103103

104+
if (!interactive()) later::run_now()
105+
104106
}
105107

106108
# nocov end

R/utils.R

Lines changed: 4 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -324,14 +324,15 @@ next_config <- function(refhook = list(), class = "", vec = FALSE, mark = FALSE)
324324

325325
#' Internal Package Function
326326
#'
327-
#' Do not use. Only present for cleaning up after running examples and tests.
327+
#' Only present for cleaning up after running examples and tests. Do not attempt
328+
#' to run the examples.
328329
#'
329330
#' @examples
330331
#' rm(list = ls())
331332
#' gc()
332333
#' Sys.sleep(1L)
333-
#' nanonext:::zzz()
334+
#' .Call(nanonext:::rnng_fini)
334335
#'
335336
#' @keywords internal
336337
#'
337-
zzz <- function() if (interactive()) later::run_now() else .Call(rnng_fini)
338+
zzz <- function() {}

man/zzz.Rd

Lines changed: 3 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

tests/tests.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -558,4 +558,4 @@ nanotestz(close(s))
558558
rm(list = ls())
559559
gc()
560560
Sys.sleep(1L)
561-
nanonext:::zzz()
561+
.Call(nanonext:::rnng_fini)

0 commit comments

Comments
 (0)