Skip to content

Commit 24a220c

Browse files
committed
CRAN release 0.10.4
1 parent 5656fcc commit 24a220c

File tree

5 files changed

+11
-12
lines changed

5 files changed

+11
-12
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: 0.10.2.9024
4+
Version: 0.10.4
55
Description: R binding for NNG (Nanomsg Next Gen), a successor to ZeroMQ. NNG is
66
a socket library implementing 'Scalability Protocols', a reliable,
77
high-performance standard for common communications patterns including

NEWS.md

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1,4 +1,4 @@
1-
# nanonext 0.10.2.9024 (development)
1+
# nanonext 0.10.4
22

33
#### New Features
44

@@ -9,7 +9,6 @@
99

1010
* `lock()` supplying 'cv' has improved behaviour which locks the socket whilst allowing for both initial connections and re-connections (when the 'cv' is registered for both add and remove pipe events).
1111
* Improves listener / dialer logic for TLS connections, allowing *inter alia* synchronous dials.
12-
* `pipe_notify()` arguments 'add', 'remove' and 'flag' now default to FALSE instead of TRUE for easier selective specification of the events to signal.
1312
* `request()` argument 'ack' removed due to stability considerations.
1413
* Fixes memory leaks detected with valgrind.
1514
* Upgrades bundled 'libmbedtls' to v 3.5.0.

R/sync.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -160,11 +160,11 @@ cv_signal <- function(cv) invisible(.Call(rnng_cv_signal, cv))
160160
#' @param cv2 [default NULL] optionally, if specified, a second
161161
#' 'conditionVariable' to signal. Note that this cv is signalled
162162
#' sequentially after the first condition variable.
163-
#' @param add [default FALSE] logical value whether to signal when a pipe is
163+
#' @param add [default TRUE] logical value whether to signal when a pipe is
164164
#' added.
165-
#' @param remove [default FALSE] logical value whether to signal when a pipe is
165+
#' @param remove [default TRUE] logical value whether to signal when a pipe is
166166
#' removed.
167-
#' @param flag [default FALSE] logical value whether to also set a flag in the
167+
#' @param flag [default TRUE] logical value whether to also set a flag in the
168168
#' 'conditionVariable'. This can help distinguish between different types of
169169
#' signal, and causes any subsequent \code{\link{wait}} to return FALSE
170170
#' instead of TRUE.
@@ -202,7 +202,7 @@ cv_signal <- function(cv) invisible(.Call(rnng_cv_signal, cv))
202202
#'
203203
#' @export
204204
#'
205-
pipe_notify <- function(socket, cv, cv2 = NULL, add = FALSE, remove = FALSE, flag = FALSE)
205+
pipe_notify <- function(socket, cv, cv2 = NULL, add = TRUE, remove = TRUE, flag = TRUE)
206206
invisible(.Call(rnng_pipe_notify, socket, cv, cv2, add, remove, flag))
207207

208208
#' Lock / Unlock a Socket

man/pipe_notify.Rd

Lines changed: 4 additions & 4 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
@@ -268,7 +268,7 @@ nanotestnano(pub <- nano("pub", listen = "inproc://ps"))
268268
nanotestnano(sub <- nano("sub", dial = "inproc://ps", autostart = NA))
269269
nanotestxp(cv <- cv())
270270
nanotestxp(cv2 <- cv())
271-
nanotestz(pipe_notify(pub$socket, cv, cv2, add = TRUE, remove = TRUE))
271+
nanotestz(pipe_notify(pub$socket, cv, cv2, add = TRUE, remove = TRUE, flag = FALSE))
272272
nanotestnano(sub$opt(name = "sub:prefnew", value = FALSE))
273273
nanotest(!sub$opt(name = "sub:prefnew"))
274274
nanotesterr(sub$opt(name = "false", value = 100), "supported")

0 commit comments

Comments
 (0)