@@ -45,7 +45,7 @@ context <- function(socket) {
4545
4646 if (is.environment(socket )) socket <- .subset2(socket , " socket" )
4747 res <- .Call(rnng_ctx_open , socket )
48- if (is.integer(res )) message(res , " : " , nng_error(res ))
48+ if (is.integer(res )) message(Sys.time(), " | " , res , " : " , nng_error(res ))
4949 res
5050
5151}
@@ -90,7 +90,7 @@ send_ctx <- function(context, data, mode = c("serial", "raw"), timeout, echo = T
9090 raw = if (is.raw(data )) data else writeBin(object = data , con = raw()))
9191 res <- .Call(rnng_ctx_send , context , data , timeout )
9292 is.integer(res ) && {
93- message(res , " : " , nng_error(res ))
93+ message(Sys.time(), " | " , res , " : " , nng_error(res ))
9494 return (invisible (res ))
9595 }
9696 if (missing(echo ) || isTRUE(echo )) res else invisible (0L )
@@ -142,7 +142,7 @@ recv_ctx <- function(context,
142142 if (missing(timeout )) timeout <- - 2L
143143 res <- .Call(rnng_ctx_recv , context , timeout )
144144 is.integer(res ) && {
145- message(res , " : " , nng_error(res ))
145+ message(Sys.time(), " | " , res , " : " , nng_error(res ))
146146 return (invisible (res ))
147147 }
148148 on.exit(expr = return (res ))
@@ -228,7 +228,7 @@ reply <- function(context,
228228 if (missing(timeout )) timeout <- - 2L
229229 res <- .Call(rnng_ctx_recv , context , timeout )
230230 is.integer(res ) && {
231- message(res , " : " , nng_error(res ))
231+ message(Sys.time(), " | " , res , " : " , nng_error(res ))
232232 return (invisible (res ))
233233 }
234234 on.exit(expr = send_aio(context , as.raw(0L ), mode = send_mode ))
@@ -244,7 +244,7 @@ reply <- function(context,
244244 on.exit()
245245 res <- .Call(rnng_ctx_send , context , data , timeout )
246246 is.integer(res ) && {
247- message(res , " : " , nng_error(res ))
247+ message(Sys.time(), " | " , res , " : " , nng_error(res ))
248248 return (invisible (res ))
249249 }
250250 invisible (0L )
@@ -311,12 +311,12 @@ request <- function(context,
311311 raw = if (is.raw(data )) data else writeBin(object = data , con = raw()))
312312 res <- .Call(rnng_send_aio , context , data , - 2L )
313313 is.integer(res ) && {
314- message(res , " : " , nng_error(res ))
314+ message(Sys.time(), " | " , res , " : " , nng_error(res ))
315315 return (invisible (res ))
316316 }
317317 res <- .Call(rnng_recv_aio , context , timeout )
318318 is.integer(res ) && {
319- message(res , " : " , nng_error(res ))
319+ message(Sys.time(), " | " , res , " : " , nng_error(res ))
320320 return (invisible (res ))
321321 }
322322 env <- `class<-`(new.env(), " recvAio" )
0 commit comments