如何将对象导出到R中函数内的并行集群

时间:2014-03-30 03:22:46

标签: r function parallel-processing

我正在编写一个函数来组合和组织数据,然后使用基础R中的并行函数并行运行MCMC链。我的函数如下。

dm100zip <- function(y, n.burn = 1, n.it = 3000, n.thin = 1) {
  y <- array(c(as.matrix(y[,2:9]), as.matrix(y[ ,10:17])), c(length(y$Plot), 8, 2))
  nplots <- nrow(y)
  ncap1 <- apply(y[,1:8, 1],1,sum)
  ncap2 <- apply(y[,1:8, 2],1,sum)
  ncap <- as.matrix(cbind(ncap1, ncap2))
  ymax1 <- apply(y[,1:8, 1],1,sum)
  ymax2 <- apply(y[,1:8, 2],1,sum)

  # Bundle data for JAGS/BUGS
  jdata100 <- list(y=y, nplots=nplots, ncap=ncap)

  # Set initial values for Gibbs sampler
  inits100 <- function(){
    list(p0=runif(1, 1.1, 2),
      p.precip=runif(1, 0, 0.1),
      p.day = runif(1, -.5, 0.1))
  }

  # Set parameters of interest to monitor and save
  params100 <- c("N", "p0")

  # Run JAGS in parallel for improved speed
  CL <- makeCluster(3) # set number of clusters = to number of desired chains
  clusterExport(cl=CL, list("jdata100", "params100", "inits100", "ymax1", "ymax2", "n.burn", "jag", "n.thin")) # make data available to jags in diff cores
  clusterSetRNGStream(cl = CL, iseed = 5312)

  out <- clusterEvalQ(CL, {
    library(rjags)
    load.module('glm')
    jm <- jags.model("dm100zip.txt", jdata100, inits100, n.adapt = n.burn, n.chains = 1)
    fm <- coda.samples(jm, params100, n.iter = n.it, thin = n.thin)
    return(as.mcmc(fm))

  })

  out.list <- mcmc.list(out) # group output from each core into one list
  stopCluster(CL)

  return(out.list)
}

当我运行该函数时,我得到一个错误,即在clusterExport函数中找不到n.burn,n.it和n.thin。例如,

dm100zip.list.nain <- dm100zip(NAIN, n.burn = 1, n.it = 3000, n.thin = 1) # returns error

如果我在运行函数之前为每个值设置了值,那么它会使用这些值并运行正常。例如,

n.burn = 1
n.it = 1000
n.thin = 1
dm100zip.list.nain <- dm100zip(NAIN, n.burn = 1, n.it = 3000, n.thin = 1) 

这样运行正常,但使用的是n.it = 1000而不是3000

有人可以帮助解决ClusterExport函数使用全局环境中的对象的原因,而不是ClusterExport运行的函数分配的值吗?有办法解决这个问题吗?

2 个答案:

答案 0 :(得分:16)

默认情况下,clusterExport在全局环境中查找“varlist”指定的变量。在您的情况下,它应该在dm100zip函数的本地环境中查找。要做到这一点,请使用clusterExport“envir”参数:

clusterExport(cl=CL, list("jdata100", "params100", "inits100", "ymax1",
                          "ymax2", "n.burn", "jag", "n.thin"),
              envir=environment())

请注意,还会找到在全局环境中定义的“varlist”中的变量,但dm100zip中定义的值将优先。

答案 1 :(得分:3)

由于R中的函数参数是使用延迟求值处理的,因此您需要确保函数执行环境中实际存在任何默认参数。实际上,R核心作者为此目的包含force函数,它只是function(x) x并强制将参数从promise转换为计算表达式。尝试进行以下修改:

dm100zip <- function(y, n.burn = 1, n.it = 3000, n.thin = 1) {
  force(n.burn); force(n.it); force(n.thin)
  # The rest of your code as above...
}

有关这些问题的更详细说明,请参阅Lazy Evaluation section of Hadley's treatment of functions