Fix reporting scripts
[morpheus.git] / reports / accuracy.R
index 05d9e8a..535f88f 100644 (file)
@@ -11,14 +11,12 @@ optimBeta <- function(N, n, K, p, beta, b, link, weights, ncores)
                                M <- computeMoments(fargs$X, fargs$Y)
                                fargs$optargs$M <- M
                                mu <- computeMu(fargs$X, fargs$Y, fargs$optargs)
+        op <- optimParams(K,fargs$optargs$link,fargs$optargs)
+        x_init <- list(p=rep(1/K,K-1), beta=mu, b=rep(0,K))
                                res2 <- NULL
                                tryCatch({
-                                       op <- optimParams(K,fargs$optargs$link,fargs$optargs)
-                                       x_init <- list(p=rep(1/K,K-1), beta=mu, b=rep(0,K))
-                                       res2 <- do.call(rbind, op$run(x_init))
-                               }, error = function(e) {
-                                       res2 <- NA
-                               })
+          res2 <- do.call(rbind, op$run(x_init))
+                               }, error = function(e) {})
                                res2
                        }
 #                      ,
@@ -50,7 +48,6 @@ optimBeta <- function(N, n, K, p, beta, b, link, weights, ncores)
                        fargs$X = io$X
                        fargs$Y = io$Y
                        fargs$optargs$K = ncol(fargs$beta)
-                       fargs$optargs$M = computeMoments(io$X,io$Y)
                        fargs
                }, N=N, ncores=ncores, verbose=TRUE)
        p <- c(p, 1-sum(p))
@@ -71,6 +68,7 @@ N <- 10
 d <- 2
 n <- 1e4
 ncores <- 1
+strw <- "1-1-1"
 weights <- c(1,1,1)
 
 cmd_args <- commandArgs()
@@ -89,7 +87,8 @@ for (arg in cmd_args)
                } else if (spl[1] == "link") {
                        link <- spl[2]
                } else if (spl[1] == "weights") {
-                 weights <- unlist(strsplit(spl[2], ","))
+                       strw <- spl[2]
+                 weights <- as.numeric(unlist(strsplit(spl[2], ",")))
                }
        }
 }
@@ -117,7 +116,7 @@ if (d == 2) {
 }
 
 mr <- optimBeta(N, n, K, p, beta, b, link, weights, ncores)
-mr_params <- list("N"=N, "n"=n, "K"=K, "d"=d, "link"=link,
+mr_params <- list("N"=N, "nc"=ncores, "n"=n, "K"=K, "d"=d, "link"=link,
        "p"=c(p,1-sum(p)), "beta"=beta, "b"=b, "weights"=weights)
 
-save("mr", "mr_params", file=paste("multirun_",n,"_",d,"_",link,".RData",sep=""))
+save("mr", "mr_params", file=paste("res_",n,"_",d,"_",link,"_",strw,".RData",sep=""))