Skip to content

Commit 6688c70

Browse files
committed
update docs on progress indicators and errors
1 parent a29c984 commit 6688c70

File tree

8 files changed

+28
-19
lines changed

8 files changed

+28
-19
lines changed

R/map.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -64,7 +64,8 @@
6464
#'
6565
#' \code{x[.progress]} collects map results whilst showing a progress bar from
6666
#' the \CRANpkg{cli} package, if installed, with completion percentage and ETA,
67-
#' or else a simple text progress indicator.
67+
#' or else a simple text progress indicator. Note: if the map operation
68+
#' completes too quickly then the progress bar may not show at all.
6869
#'
6970
#' \code{x[.stop]} collects map results applying early stopping, which stops at
7071
#' the first failure and cancels remaining operations. Note: operations already

R/mirai.R

Lines changed: 7 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -88,9 +88,10 @@
8888
#' @section Errors:
8989
#'
9090
#' If an error occurs in evaluation, the error message is returned as a
91-
#' character string of class \sQuote{miraiError} and \sQuote{errorValue} (the
92-
#' stack trace is available at \code{$stack.trace} on the error object).
93-
#' \code{\link{is_mirai_error}} may be used to test for this.
91+
#' character string of class \sQuote{miraiError} and \sQuote{errorValue}.
92+
#' \code{\link{is_mirai_error}} may be used to test for this. The elements of
93+
#' the original condition are accessible via \code{$} on the error object. A
94+
#' stack trace is also available at \code{$stack.trace}.
9495
#'
9596
#' If a daemon crashes or terminates unexpectedly during evaluation, an
9697
#' \sQuote{errorValue} 19 (Connection reset) is returned.
@@ -524,8 +525,9 @@ is_mirai_map <- function(x) inherits(x, "mirai_map")
524525
#'
525526
#' Is the object a \sQuote{miraiError}. When execution in a \sQuote{mirai}
526527
#' process fails, the error message is returned as a character string of class
527-
#' \sQuote{miraiError} and \sQuote{errorValue}. The stack trace is available at
528-
#' \code{$stack.trace} on the error object.
528+
#' \sQuote{miraiError} and \sQuote{errorValue}. The elements of the original
529+
#' condition are accessible via \code{$} on the error object. A stack trace is
530+
#' also available at \code{$stack.trace}.
529531
#'
530532
#' Is the object a \sQuote{miraiInterrupt}. When an ongoing \sQuote{mirai} is
531533
#' sent a user interrupt, it will resolve to an empty character string classed

man/call_mirai.Rd

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

man/collect_mirai.Rd

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

man/dot-flat.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/is_mirai_error.Rd

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

man/mirai.Rd

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

man/mirai_map.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)