We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
daemons()
1 parent ef60fbe commit 25fff3eCopy full SHA for 25fff3e
R/daemons.R
@@ -260,13 +260,15 @@ daemons <- function(
260
is.numeric(n) || stop(._[["numeric_n"]])
261
n <- as.integer(n)
262
263
- if (n == 0L) {
+ n == 0L && {
264
is.null(envir) && return(0L)
265
266
if (signal) send_signal(envir)
267
reap(envir[["sock"]])
268
..[[.compute]] <- NULL -> envir
269
- } else if (is.null(envir)) {
+ return(0L)
270
+ }
271
+ if (is.null(envir)) {
272
n > 0L || stop(._[["n_zero"]])
273
dynGet(".mirai_within_map", ifnotfound = FALSE) && stop(._[["within_map"]])
274
envir <- init_envir_stream(seed)
@@ -284,7 +286,6 @@ daemons <- function(
284
286
}
285
287
288
- is.null(envir) && return(0L)
289
`class<-`(envir[["n"]], c("miraiDaemons", .compute))
290
291
0 commit comments