Skip to content

Commit d695c1e

Browse files
committed
improves collect_pipe() docs
1 parent f416b60 commit d695c1e

File tree

2 files changed

+14
-16
lines changed

2 files changed

+14
-16
lines changed

R/socket.R

Lines changed: 7 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -117,10 +117,10 @@ socket <- function(protocol = c("bus", "pair", "poly", "push", "pull", "pub",
117117

118118
#' Collect the Pipe from an Aio
119119
#'
120-
#' This function blocks until it has received a message from the Aio. The Pipe
121-
#' used to receive the message is returned and the message is still
122-
#' available for retrieval by normal means. A Pipe is a low-level object and
123-
#' it is not normally necessary to deal with them directly.
120+
#' This function retrieves the Pipe used to receive a message from the Aio. It
121+
#' will block if the Aio has yet to complete. The message is still available
122+
#' for retrieval by the usual means. A Pipe is a low-level object and it is
123+
#' not normally necessary to deal with them directly.
124124
#'
125125
#' @param x a 'recvAio' object.
126126
#'
@@ -131,10 +131,9 @@ socket <- function(protocol = c("bus", "pair", "poly", "push", "pull", "pub",
131131
#' @return A Pipe (object of class \sQuote{nanoPipe}).
132132
#'
133133
#' @examples
134-
#' s <- socket("rep")
135-
#' listen(s)
136-
#' s1 <- socket("req")
137-
#' dial(s1)
134+
#' s <- socket("rep", listen = "inproc://nanonext")
135+
#' s1 <- socket("req", dial = "inproc://nanonext")
136+
#'
138137
#' r <- recv_aio(s, timeout = 500)
139138
#'
140139
#' if (!send(s1, "")) {

man/collect_pipe.Rd

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

0 commit comments

Comments
 (0)