我喜欢.progress = 'text'
plyr's
中的设置llply
。然而,由于列表项被发送到各个核心,然后在最后进行整理,因此我很不安地知道mclapply
(来自包multicore
)的距离是多远。
我一直在输出*currently in sim_id # ....*
之类的消息,但这并不是很有帮助,因为它没有给我一个指示列表项完成百分比的指标(虽然知道我的脚本不是很有帮助'卡住并继续前行。
有人可以建议其他想法让我查看我的.Rout
文件并获得进步感吗?我考虑过添加一个手动计数器,但是无法看到我将如何实现,因为mclapply
必须完成处理所有列表项目才能发出任何反馈。
答案 0 :(得分:26)
由于mclapply
会生成多个进程,因此可能需要使用fifos,管道甚至套接字。现在考虑以下示例:
library(multicore)
finalResult <- local({
f <- fifo(tempfile(), open="w+b", blocking=T)
if (inherits(fork(), "masterProcess")) {
# Child
progress <- 0.0
while (progress < 1 && !isIncomplete(f)) {
msg <- readBin(f, "double")
progress <- progress + as.numeric(msg)
cat(sprintf("Progress: %.2f%%\n", progress * 100))
}
exit()
}
numJobs <- 100
result <- mclapply(1:numJobs, function(...) {
# Dome something fancy here
# ...
# Send some progress update
writeBin(1/numJobs, f)
# Some arbitrary result
sample(1000, 1)
})
close(f)
result
})
cat("Done\n")
这里,临时文件用作fifo,主进程分叉一个孩子,他的唯一职责是报告当前进度。主进程继续调用mclapply
,其中要评估的表达式(更准确地说,表达式块)通过writeBin
将部分进度信息写入fifo缓冲区。
由于这只是一个简单的例子,您可能需要根据需要调整整个输出内容。 HTH!
答案 1 :(得分:13)
基本上添加了另一个版本的@ fotNelson的解决方案,但进行了一些修改:
parallel
而不是multicore
现已从CRAN中删除希望这有助于某人...
library(parallel)
#-------------------------------------------------------------------------------
#' Wrapper around mclapply to track progress
#'
#' Based on http://stackoverflow.com/questions/10984556
#'
#' @param X a vector (atomic or list) or an expressions vector. Other
#' objects (including classed objects) will be coerced by
#' ‘as.list’
#' @param FUN the function to be applied to
#' @param ... optional arguments to ‘FUN’
#' @param mc.preschedule see mclapply
#' @param mc.set.seed see mclapply
#' @param mc.silent see mclapply
#' @param mc.cores see mclapply
#' @param mc.cleanup see mclapply
#' @param mc.allow.recursive see mclapply
#' @param mc.progress track progress?
#' @param mc.style style of progress bar (see txtProgressBar)
#'
#' @examples
#' x <- mclapply2(1:1000, function(i, y) Sys.sleep(0.01))
#' x <- mclapply2(1:3, function(i, y) Sys.sleep(1), mc.cores=1)
#'
#' dat <- lapply(1:10, function(x) rnorm(100))
#' func <- function(x, arg1) mean(x)/arg1
#' mclapply2(dat, func, arg1=10, mc.cores=2)
#-------------------------------------------------------------------------------
mclapply2 <- function(X, FUN, ...,
mc.preschedule = TRUE, mc.set.seed = TRUE,
mc.silent = FALSE, mc.cores = getOption("mc.cores", 2L),
mc.cleanup = TRUE, mc.allow.recursive = TRUE,
mc.progress=TRUE, mc.style=3)
{
if (!is.vector(X) || is.object(X)) X <- as.list(X)
if (mc.progress) {
f <- fifo(tempfile(), open="w+b", blocking=T)
p <- parallel:::mcfork()
pb <- txtProgressBar(0, length(X), style=mc.style)
setTxtProgressBar(pb, 0)
progress <- 0
if (inherits(p, "masterProcess")) {
while (progress < length(X)) {
readBin(f, "double")
progress <- progress + 1
setTxtProgressBar(pb, progress)
}
cat("\n")
parallel:::mcexit()
}
}
tryCatch({
result <- mclapply(X, ..., function(...) {
res <- FUN(...)
if (mc.progress) writeBin(1, f)
res
},
mc.preschedule = mc.preschedule, mc.set.seed = mc.set.seed,
mc.silent = mc.silent, mc.cores = mc.cores,
mc.cleanup = mc.cleanup, mc.allow.recursive = mc.allow.recursive
)
}, finally = {
if (mc.progress) close(f)
})
result
}
答案 2 :(得分:8)
pbapply
包已针对一般情况实现了此功能。 pblapply
和pbsapply
都有cl
个参数。来自documentation:
可以通过
cl
参数启用并行处理。parLapply
当cl
是“cluster
”对象时调用,mclapply
时调用cl
整数。显示进度条可增加通信 主进程与节点/子进程之间的开销进行了比较 没有进度条的函数的并行等价物。 这些功能可以追溯到原来的等价物 进度条已停用(即getOption("pboptions")$type == "none"
dopb()
是FALSE
)。这是interactive()
时的默认值 ifFALSE
(即从命令行R脚本调用)。
如果一个人不提供cl
(或通过NULL
),则会使用默认的非并行lapply
,还包括一个进度条。
答案 3 :(得分:7)
这是一个基于@fotNelton's solution的函数,适用于通常使用mcapply的地方。
mcadply <- function(X, FUN, ...) {
# Runs multicore lapply with progress indicator and transformation to
# data.table output. Arguments mirror those passed to lapply.
#
# Args:
# X: Vector.
# FUN: Function to apply to each value of X. Note this is transformed to
# a data.frame return if necessary.
# ...: Other arguments passed to mclapply.
#
# Returns:
# data.table stack of each mclapply return value
#
# Progress bar code based on https://stackoverflow.com/a/10993589
require(multicore)
require(plyr)
require(data.table)
local({
f <- fifo(tempfile(), open="w+b", blocking=T)
if (inherits(fork(), "masterProcess")) {
# Child
progress <- 0
print.progress <- 0
while (progress < 1 && !isIncomplete(f)) {
msg <- readBin(f, "double")
progress <- progress + as.numeric(msg)
# Print every 1%
if(progress >= print.progress + 0.01) {
cat(sprintf("Progress: %.0f%%\n", progress * 100))
print.progress <- floor(progress * 100) / 100
}
}
exit()
}
newFun <- function(...) {
writeBin(1 / length(X), f)
return(as.data.frame(FUN(...)))
}
result <- as.data.table(rbind.fill(mclapply(X, newFun, ...)))
close(f)
cat("Done\n")
return(result)
})
}
答案 4 :(得分:2)
基于@fotNelson的答案,使用进度条而不是逐行打印并使用mclapply调用外部函数。
library('utils')
library('multicore')
prog.indic <- local({ #evaluates in local environment only
f <- fifo(tempfile(), open="w+b", blocking=T) # open fifo connection
assign(x='f',value=f,envir=.GlobalEnv)
pb <- txtProgressBar(min=1, max=MC,style=3)
if (inherits(fork(), "masterProcess")) { #progress tracker
# Child
progress <- 0.0
while (progress < MC && !isIncomplete(f)){
msg <- readBin(f, "double")
progress <- progress + as.numeric(msg)
# Updating the progress bar.
setTxtProgressBar(pb,progress)
}
exit()
}
MC <- 100
result <- mclapply(1:MC, .mcfunc)
cat('\n')
assign(x='result',value=result,envir=.GlobalEnv)
close(f)
})
.mcfunc<-function(i,...){
writeBin(1, f)
return(i)
}
为了从mclapply调用之外的函数使用它,必须将。fifo连接分配给.GlobalEnv。感谢您提出问题以及之前的回复,我一直想知道如何做一段时间。
答案 5 :(得分:0)
您可以使用系统回显功能从您的工作程序中进行写入,因此只需在函数中添加以下行即可:
myfun <- function(x){
if(x %% 5 == 0) system(paste("echo 'now processing:",x,"'"))
dosomething(mydata[x])
}
result <- mclapply(1:10,myfun,mc.cores=5)
> now processing: 5
> now processing: 10
例如,如果您传递索引,则将起作用,而不是传递数据列表,而是传递索引并在worker函数中提取数据。