Skip to content

Commit c0b88fa

Browse files
committed
Retain current exports
1 parent a2b0d7e commit c0b88fa

File tree

9 files changed

+97
-13
lines changed

9 files changed

+97
-13
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
Package: nanonext
22
Type: Package
33
Title: NNG (Nanomsg Next Gen) Lightweight Messaging Library
4-
Version: 1.5.1.9001
4+
Version: 1.5.1.9002
55
Description: R binding for NNG (Nanomsg Next Gen), a successor to ZeroMQ. NNG is
66
a socket library for reliable, high-performance messaging over in-process,
77
IPC, TCP, WebSocket and secure TLS transports. Implements 'Scalability

NAMESPACE

Lines changed: 4 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -42,7 +42,11 @@ S3method(utils::.DollarNames,recvAio)
4242
S3method(utils::.DollarNames,sendAio)
4343
export("%~>%")
4444
export("opt<-")
45+
export(.advance)
4546
export(.context)
47+
export(.interrupt)
48+
export(.keep)
49+
export(.mark)
4650
export(.unresolved)
4751
export(call_aio)
4852
export(call_aio_)

R/aio.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -402,6 +402,7 @@ is.promising.recvAio <- function(x) TRUE
402402
#'
403403
#' @return NULL.
404404
#'
405-
#' @noRd
405+
#' @keywords internal
406+
#' @export
406407
#'
407408
.keep <- function(x, ctx) .Call(rnng_set_promise_context, x, ctx)

R/utils.R

Lines changed: 6 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -316,7 +316,8 @@ serial_config <- function(class, sfunc, ufunc, vec = FALSE)
316316
#'
317317
#' @return The logical value `x` supplied.
318318
#'
319-
#' @noRd
319+
#' @keywords internal
320+
#' @export
320321
#'
321322
.mark <- function(x = TRUE) .Call(rnng_set_marker, x)
322323

@@ -326,7 +327,8 @@ serial_config <- function(class, sfunc, ufunc, vec = FALSE)
326327
#'
327328
#' @return NULL.
328329
#'
329-
#' @noRd
330+
#' @keywords internal
331+
#' @export
330332
#'
331333
.advance <- function() .Call(rnng_advance_rng_state)
332334

@@ -339,7 +341,8 @@ serial_config <- function(class, sfunc, ufunc, vec = FALSE)
339341
#'
340342
#' @return The logical value `x` supplied.
341343
#'
342-
#' @noRd
344+
#' @keywords internal
345+
#' @export
343346
#'
344347
.interrupt <- function(x = TRUE) .Call(rnng_interrupt_switch, x)
345348

man/dot-advance.Rd

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

man/dot-interrupt.Rd

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

man/dot-keep.Rd

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

man/dot-mark.Rd

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

tests/tests.R

Lines changed: 8 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -87,7 +87,7 @@ test_zero(n$send(1:5, mode = "r"))
8787
test_equal(length(n1$recv("int", block = 500)), 5L)
8888
test_true(is_aio(saio <- n1$send_aio(paste(replicate(5, random(1e3L)), collapse = ""), mode = 1L, timeout = 900)))
8989
test_print(saio)
90-
if (later) test_null(nanonext:::.keep(saio, new.env()))
90+
if (later) test_null(.keep(saio, new.env()))
9191
test_class("sendAio", call_aio(saio))
9292
test_zero(saio$result)
9393
test_error(n$send("wrong mode", mode = "none"), "mode")
@@ -206,9 +206,9 @@ test_error(req$opt("false", list()), "type")
206206

207207
test_class("nanoContext", ctx <- context(rep))
208208
test_print(ctx)
209-
test_true(nanonext:::.mark())
209+
test_true(.mark())
210210
test_class("sendAio", csaio <- req$send_aio(data.frame(), mode = "seria", timeout = 500))
211-
test_true(!nanonext:::.mark(FALSE))
211+
test_true(!.mark(FALSE))
212212
test_zero(call_aio_(csaio)$result)
213213
test_class("recvAio", craio <- recv_aio(ctx, timeout = 500))
214214
test_type("list", collect_aio(craio))
@@ -568,8 +568,8 @@ test_error(collect_aio_(list("a")), "object is not an Aio or list of Aios")
568568
test_error(collect_aio(list(fakesock)), "object is not an Aio or list of Aios")
569569
test_null(stop_aio("a"))
570570
test_null(stop_aio(list("a")))
571-
test_null(nanonext:::.keep(NULL, new.env()))
572-
test_null(nanonext:::.keep(new.env(), new.env()))
571+
test_null(.keep(NULL, new.env()))
572+
test_null(.keep(new.env(), new.env()))
573573

574574
pem <- "-----BEGIN CERTIFICATE----- -----END CERTIFICATE-----"
575575
test_tls <- function(pem) {
@@ -621,9 +621,9 @@ if (promises) test_zero(close(s1))
621621
if (promises) test_zero(close(s))
622622
if (promises) later::run_now()
623623

624-
test_true(nanonext:::.interrupt())
625-
test_true(!nanonext:::.interrupt(FALSE))
626-
test_true(!identical(get0(".Random.seed"), {nanonext:::.advance(); .Random.seed}))
624+
test_true(.interrupt())
625+
test_true(!.interrupt(FALSE))
626+
test_true(!identical(get0(".Random.seed"), {.advance(); .Random.seed}))
627627
test_type("integer", .Call(nanonext:::rnng_traverse_precious))
628628
if (Sys.info()[["sysname"]] == "Linux") {
629629
rm(list = ls())

0 commit comments

Comments
 (0)