Skip to content

Commit b681b3f

Browse files
committed
further updates to C code
1 parent 45b8f83 commit b681b3f

File tree

4 files changed

+565
-558
lines changed

4 files changed

+565
-558
lines changed

R/ncurl.R

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -52,7 +52,6 @@ ncurl <- function(url, async = FALSE, method = NULL, headers = NULL, data = NULL
5252
if (missing(async) || !isTRUE(async)) {
5353

5454
res <- .Call(rnng_ncurl, url, method, headers, data)
55-
missing(res) && return(invisible())
5655
if (is.integer(res)) {
5756
logerror(res)
5857
return(invisible(res))

0 commit comments

Comments
 (0)