@@ -53,7 +53,7 @@ send_aio.nanoSocket <- function(con, data, mode = c("serial", "raw"), timeout =
5353 force(data )
5454 data <- encode(data = data , mode = mode )
5555 aio <- .Call(rnng_send_aio , con , data , timeout )
56- is.integer(aio ) && return (invisible ( aio ) )
56+ is.integer(aio ) && return (aio )
5757
5858 data <- result <- NULL
5959 unresolv <- TRUE
@@ -82,7 +82,7 @@ send_aio.nanoContext <- function(con, data, mode = c("serial", "raw"), timeout =
8282 force(data )
8383 data <- encode(data = data , mode = mode )
8484 aio <- .Call(rnng_ctx_send_aio , con , data , timeout )
85- is.integer(aio ) && return (invisible ( aio ) )
85+ is.integer(aio ) && return (aio )
8686
8787 data <- result <- NULL
8888 unresolv <- TRUE
@@ -110,7 +110,7 @@ send_aio.nanoStream <- function(con, data, mode = "raw", timeout = -2L) {
110110 force(data )
111111 data <- encode(data = data , mode = 2L )
112112 aio <- .Call(rnng_stream_send_aio , con , data , timeout )
113- is.integer(aio ) && return (invisible ( aio ) )
113+ is.integer(aio ) && return (aio )
114114
115115 data <- result <- NULL
116116 unresolv <- TRUE
@@ -207,7 +207,7 @@ recv_aio.nanoSocket <- function(con,
207207 mode <- match.arg2(mode , c(" serial" , " character" , " complex" , " double" ,
208208 " integer" , " logical" , " numeric" , " raw" ))
209209 aio <- .Call(rnng_recv_aio , con , timeout )
210- is.integer(aio ) && return (invisible ( aio ) )
210+ is.integer(aio ) && return (aio )
211211
212212 keep.raw <- missing(keep.raw ) || isTRUE(keep.raw )
213213 data <- raw <- NULL
@@ -222,7 +222,7 @@ recv_aio.nanoSocket <- function(con,
222222 data <<- raw <<- res
223223 aio <<- env [[" aio" ]] <<- NULL
224224 unresolv <<- FALSE
225- return (invisible ( res ) )
225+ return (res )
226226 }
227227 on.exit(expr = {
228228 raw <<- res
@@ -248,7 +248,7 @@ recv_aio.nanoSocket <- function(con,
248248 data <<- raw <<- res
249249 aio <<- env [[" aio" ]] <<- NULL
250250 unresolv <<- FALSE
251- return (invisible ( res ) )
251+ return (res )
252252 }
253253 on.exit(expr = {
254254 data <<- res
@@ -283,7 +283,7 @@ recv_aio.nanoContext <- function(con,
283283 mode <- match.arg2(mode , c(" serial" , " character" , " complex" , " double" ,
284284 " integer" , " logical" , " numeric" , " raw" ))
285285 aio <- .Call(rnng_ctx_recv_aio , con , timeout )
286- is.integer(aio ) && return (invisible ( aio ) )
286+ is.integer(aio ) && return (aio )
287287
288288 keep.raw <- missing(keep.raw ) || isTRUE(keep.raw )
289289 data <- raw <- NULL
@@ -298,7 +298,7 @@ recv_aio.nanoContext <- function(con,
298298 data <<- raw <<- res
299299 aio <<- env [[" aio" ]] <<- NULL
300300 unresolv <<- FALSE
301- return (invisible ( res ) )
301+ return (res )
302302 }
303303 on.exit(expr = {
304304 raw <<- res
@@ -324,7 +324,7 @@ recv_aio.nanoContext <- function(con,
324324 data <<- raw <<- res
325325 aio <<- env [[" aio" ]] <<- NULL
326326 unresolv <<- FALSE
327- return (invisible ( res ) )
327+ return (res )
328328 }
329329 on.exit(expr = {
330330 data <<- res
@@ -360,7 +360,7 @@ recv_aio.nanoStream <- function(con,
360360 mode <- match.arg2(mode , c(" character" , " complex" , " double" , " integer" ,
361361 " logical" , " numeric" , " raw" )) + 1L
362362 aio <- .Call(rnng_stream_recv_aio , con , n , timeout )
363- is.integer(aio ) && return (invisible ( aio ) )
363+ is.integer(aio ) && return (aio )
364364
365365 keep.raw <- missing(keep.raw ) || isTRUE(keep.raw )
366366 data <- raw <- NULL
@@ -375,7 +375,7 @@ recv_aio.nanoStream <- function(con,
375375 data <<- raw <<- res
376376 aio <<- env [[" aio" ]] <<- NULL
377377 unresolv <<- FALSE
378- return (invisible ( res ) )
378+ return (res )
379379 }
380380 on.exit(expr = {
381381 raw <<- res
@@ -401,7 +401,7 @@ recv_aio.nanoStream <- function(con,
401401 data <<- raw <<- res
402402 aio <<- env [[" aio" ]] <<- NULL
403403 unresolv <<- FALSE
404- return (invisible ( res ) )
404+ return (res )
405405 }
406406 on.exit(expr = {
407407 data <<- res
0 commit comments