git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/crlmm@49895 bc3139a8-67e5-0310-9ffc-ced21a209358
... | ... |
@@ -117,6 +117,7 @@ genotype <- function(filenames, |
117 | 117 |
sns=sns, |
118 | 118 |
verbose=verbose, |
119 | 119 |
batch=batch) |
120 |
+ ##save(callSet, file=file.path(outdir, "callSet.rda")) |
|
120 | 121 |
open(callSet) |
121 | 122 |
mixtureParams <- matrix(NA, 4, length(filenames)) |
122 | 123 |
is.snp <- isSnp(callSet) |
... | ... |
@@ -139,9 +140,9 @@ genotype <- function(filenames, |
139 | 140 |
if(is.lds){ |
140 | 141 |
open(snprmaRes[["A"]]) |
141 | 142 |
open(snprmaRes[["B"]]) |
142 |
- bb = ocProbesets()*ncol(A)*8 |
|
143 |
- ffrowapply(A(callSet)[i1:i2, ] <- snprmaRes[["A"]][i1:i2, ], X=snprmaRes[["A"]], BATCHBYTES=bb) |
|
144 |
- ffrowapply(B(callSet)[i1:i2, ] <- snprmaRes[["B"]][i1:i2, ], X=snprmaRes[["B"]], BATCHBYTES=bb) |
|
143 |
+ ##bb <- getOption("ffbatchbytes") |
|
144 |
+ ffrowapply(A(callSet)[i1:i2, ] <- snprmaRes[["A"]][i1:i2, ], X=snprmaRes[["A"]])##, BATCHBYTES=bb) |
|
145 |
+ ffrowapply(B(callSet)[i1:i2, ] <- snprmaRes[["B"]][i1:i2, ], X=snprmaRes[["B"]])##, BATCHBYTES=bb) |
|
145 | 146 |
} else{ |
146 | 147 |
A(callSet)[snp.index, ] <- snprmaRes[["A"]] |
147 | 148 |
B(callSet)[snp.index, ] <- snprmaRes[["B"]] |
... | ... |
@@ -196,8 +197,8 @@ genotype <- function(filenames, |
196 | 197 |
if(is.lds){ |
197 | 198 |
open(tmp[["calls"]]) |
198 | 199 |
open(tmp[["confs"]]) |
199 |
- ffrowapply(snpCall(callSet)[i1:i2, ] <- tmp[["calls"]][i1:i2, ], X=tmp[["calls"]], BATCHBYTES=bb) |
|
200 |
- ffrowapply(snpCallProbability(callSet)[i1:i2, ] <- tmp[["confs"]][i1:i2, ], X=tmp[["confs"]], BATCHBYTES=bb) |
|
200 |
+ ffrowapply(snpCall(callSet)[i1:i2, ] <- tmp[["calls"]][i1:i2, ], X=tmp[["calls"]])#, BATCHBYTES=bb) |
|
201 |
+ ffrowapply(snpCallProbability(callSet)[i1:i2, ] <- tmp[["confs"]][i1:i2, ], X=tmp[["confs"]])#, BATCHBYTES=bb) |
|
201 | 202 |
close(tmp[["calls"]]) |
202 | 203 |
close(tmp[["confs"]]) |
203 | 204 |
} else { |
... | ... |
@@ -1380,7 +1381,8 @@ constructIlluminaAssayData <- function(np, snp, object, storage.mode="environmen |
1380 | 1381 |
} |
1381 | 1382 |
np <- lapply(np, stripnames) |
1382 | 1383 |
snp <- lapply(snp, stripnames) |
1383 |
- if(is(snp[[1]], "ff")){ |
|
1384 |
+ is.ff <- is(snp[[1]], "ff") | is(snp[[1]], "ffdf") |
|
1385 |
+ if(is.ff){ |
|
1384 | 1386 |
lapply(snp, open) |
1385 | 1387 |
open(calls(object)) |
1386 | 1388 |
open(snpCallProbability(object)) |
... | ... |
@@ -1393,7 +1395,7 @@ constructIlluminaAssayData <- function(np, snp, object, storage.mode="environmen |
1393 | 1395 |
A.np <- np[[1]] |
1394 | 1396 |
B.np <- np[[2]] |
1395 | 1397 |
nc <- ncol(object) |
1396 |
- if(is(A.snp, "ff")){ |
|
1398 |
+ if(is.ff){ |
|
1397 | 1399 |
NA.vec <- rep(NA, nrow(A.np)) |
1398 | 1400 |
AA <- initializeBigMatrix("A", nr, nc, vmode="integer") |
1399 | 1401 |
BB <- initializeBigMatrix("B", nr, nc, vmode="integer") |
... | ... |
@@ -7,7 +7,7 @@ setMethod("Ns", signature(object="AssayData"), |
7 | 7 |
batchnames <- sampleNames(object) |
8 | 8 |
if(!missing.j) batchnames <- batchnames[j] |
9 | 9 |
if(missing.i & missing.j) stop("Must specify either the rows i or batches j") |
10 |
- is.ff <- is(assayDataElement(object, "N.AA"), "ff") |
|
10 |
+ is.ff <- is(assayDataElement(object, "N.AA"), "ff") | is(assayDataElement(object, "N.AA"), "ffdf") |
|
11 | 11 |
if(is.ff){ |
12 | 12 |
open(assayDataElement(object, "N.AA")) |
13 | 13 |
open(assayDataElement(object, "N.AB")) |
... | ... |
@@ -38,7 +38,7 @@ setMethod("corr", signature(object="AssayData"), |
38 | 38 |
batchnames <- sampleNames(object) |
39 | 39 |
if(!missing.j) batchnames <- batchnames[j] |
40 | 40 |
if(missing.i & missing.j) stop("Must specify either the rows i or batches j") |
41 |
- is.ff <- is(assayDataElement(object, "corrAA"), "ff") |
|
41 |
+ is.ff <- is(assayDataElement(object, "corrAA"), "ff") | is(assayDataElement(object, "corrAA"), "ffdf") |
|
42 | 42 |
if(is.ff){ |
43 | 43 |
open(assayDataElement(object, "corrAA")) |
44 | 44 |
open(assayDataElement(object, "corrAB")) |