git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/crlmm@45686 bc3139a8-67e5-0310-9ffc-ced21a209358
... | ... |
@@ -419,30 +419,6 @@ crlmmGT2 <- function(A, B, SNR, mixtureParams, cdfName, row.names=NULL, |
419 | 419 |
cIndexes=cIndexes, SMEDIAN=SMEDIAN, |
420 | 420 |
theKnots=theKnots, DF=DF, probs=probs, |
421 | 421 |
batchSize=ocProbesets()) |
422 |
-## last <- 0 |
|
423 |
-## for (idxBatch in seq(along=snpBatches)){ |
|
424 |
-## snps <- snpBatches[[idxBatch]] |
|
425 |
-## rSnps <- range(snps) |
|
426 |
-## IndexesBatch <- list(autosomeIndex[autosomeIndex %in% snps]-last, |
|
427 |
-## XIndex[XIndex %in% snps]-last, |
|
428 |
-## YIndex[YIndex %in% snps]-last) |
|
429 |
-## IndexesBatch <- lapply(IndexesBatch, as.integer) |
|
430 |
-## tmpA <- A[snps,] |
|
431 |
-## tmpB <- B[snps,] |
|
432 |
-## newparamsBatch[[idxBatch]] <- gtypeCallerR(tmpA, tmpB, fIndex, mIndex, |
|
433 |
-## params[["centers"]][snps,], |
|
434 |
-## params[["scales"]][snps,], |
|
435 |
-## params[["N"]][snps,], |
|
436 |
-## IndexesBatch, cIndexes, |
|
437 |
-## sapply(IndexesBatch, length), |
|
438 |
-## sapply(cIndexes, length), |
|
439 |
-## SMEDIAN, theKnots, |
|
440 |
-## mixtureParams[], DF, probs, 0.025) |
|
441 |
-## last <- rSnps[2] |
|
442 |
-## rm(snps, rSnps, IndexesBatch, tmpA, tmpB) |
|
443 |
-## } |
|
444 |
-## rm(last) |
|
445 |
- |
|
446 | 422 |
newparams <- vector("list", 3) |
447 | 423 |
names(newparams) <- c("centers", "scales", "N") |
448 | 424 |
newparams[["centers"]] <- do.call("rbind", lapply(newparamsBatch, "[[", 1)) |
... | ... |
@@ -525,8 +501,6 @@ crlmmGT2 <- function(A, B, SNR, mixtureParams, cdfName, row.names=NULL, |
525 | 501 |
## ## MOVE TO C####### |
526 | 502 |
|
527 | 503 |
## running in batches |
528 |
- ## snpBatches <- splitIndicesByLength(1:nrow(A), ocProbesets()) |
|
529 |
- |
|
530 | 504 |
process2 <- function(idxBatch, snpBatches, autosomeIndex, XIndex, |
531 | 505 |
YIndex, A, B, mixtureParams, fIndex, mIndex, |
532 | 506 |
params, cIndexes, SMEDIAN, theKnots, DF, probs, |
... | ... |
@@ -569,35 +543,6 @@ crlmmGT2 <- function(A, B, SNR, mixtureParams, cdfName, row.names=NULL, |
569 | 543 |
mIndex=mIndex, params=params, cIndexes=cIndexes, |
570 | 544 |
SMEDIAN=SMEDIAN, theKnots=theKnots, DF=DF, probs=probs, |
571 | 545 |
regionInfo=regionInfo, batchSize=ocProbesets()) |
572 |
- |
|
573 |
-## last <- 0 |
|
574 |
-## for (idxBatch in seq(along=snpBatches)){ |
|
575 |
-## snps <- snpBatches[[idxBatch]] |
|
576 |
-## tmpA <- A[snps,] |
|
577 |
-## tmpB <- B[snps,] |
|
578 |
-## rSnps <- range(snps) |
|
579 |
-## IndexesBatch <- list(autosomeIndex[autosomeIndex %in% snps]-last, |
|
580 |
-## XIndex[XIndex %in% snps]-last, |
|
581 |
-## YIndex[YIndex %in% snps]-last) |
|
582 |
-## IndexesBatch <- lapply(IndexesBatch, as.integer) |
|
583 |
-## ImNull <- gtypeCallerR2(tmpA, tmpB, fIndex, mIndex, |
|
584 |
-## params[["centers"]][snps,], |
|
585 |
-## params[["scales"]][snps,], |
|
586 |
-## params[["N"]][snps,], |
|
587 |
-## IndexesBatch, cIndexes, |
|
588 |
-## sapply(IndexesBatch, length), |
|
589 |
-## sapply(cIndexes, length), |
|
590 |
-## SMEDIAN, theKnots, mixtureParams[], |
|
591 |
-## DF, probs, 0.025, |
|
592 |
-## which(regionInfo[snps, 2]), |
|
593 |
-## which(regionInfo[snps, 1])) |
|
594 |
-## A[snps,] <- tmpA |
|
595 |
-## B[snps,] <- tmpB |
|
596 |
-## last <- rSnps[2] |
|
597 |
-## rm(tmpA, tmpB, snps, rSnps, IndexesBatch, ImNull) |
|
598 |
-## } |
|
599 |
-## |
|
600 |
-## gc(verbose=FALSE) |
|
601 | 546 |
## END MOVE TO C####### |
602 | 547 |
## ################## |
603 | 548 |
|