git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/crlmm@52816 bc3139a8-67e5-0310-9ffc-ced21a209358
... | ... |
@@ -319,7 +319,7 @@ fit.wls <- function(NN, sigma, allele, Y, autosome, X){ |
319 | 319 |
shrinkGenotypeSummaries <- function(strata, index.list, object, MIN.OBS, MIN.SAMPLES, DF.PRIOR, |
320 | 320 |
verbose, is.lds){ |
321 | 321 |
if(is.lds) {physical <- get("physical"); open(object)} |
322 |
- if(verbose) message("Probe stratum ", strata, " of ", length(index.list)) |
|
322 |
+ if(verbose) message(" Probe stratum ", strata, " of ", length(index.list)) |
|
323 | 323 |
marker.index <- index.list[[strata]] |
324 | 324 |
batches <- split(seq_along(batch(object)), as.character(batch(object))) |
325 | 325 |
batches <- batches[sapply(batches, length) >= MIN.SAMPLES] |
... | ... |
@@ -455,7 +455,7 @@ fit.lm1 <- function(strata, |
455 | 455 |
verbose, is.lds, |
456 | 456 |
CHR.X, ...){ |
457 | 457 |
if(is.lds) {physical <- get("physical"); open(object)} |
458 |
- if(verbose) message("Probe stratum ", strata, " of ", length(index.list)) |
|
458 |
+ if(verbose) message(" Probe stratum ", strata, " of ", length(index.list)) |
|
459 | 459 |
snps <- index.list[[strata]] |
460 | 460 |
batches <- split(seq_along(batch(object)), as.character(batch(object))) |
461 | 461 |
batches <- batches[sapply(batches, length) >= MIN.SAMPLES] |
... | ... |
@@ -535,7 +535,7 @@ fit.lm2 <- function(strata, |
535 | 535 |
MIN.PHI, |
536 | 536 |
verbose, is.lds, CHR.X, ...){ |
537 | 537 |
if(is.lds) {physical <- get("physical"); open(object)} |
538 |
- if(verbose) message("Probe stratum ", strata, " of ", length(index.list)) |
|
538 |
+ if(verbose) message(" Probe stratum ", strata, " of ", length(index.list)) |
|
539 | 539 |
marker.index <- index.list[[strata]] |
540 | 540 |
batches <- split(seq_along(batch(object)), as.character(batch(object))) |
541 | 541 |
batches <- batches[sapply(batches, length) >= MIN.SAMPLES] |
... | ... |
@@ -717,7 +717,7 @@ fit.lm3 <- function(strata, |
717 | 717 |
MIN.PHI, |
718 | 718 |
verbose, is.lds, CHR.X, ...){ |
719 | 719 |
if(is.lds) {physical <- get("physical"); open(object)} |
720 |
- if(verbose) message("Probe stratum ", strata, " of ", length(index.list)) |
|
720 |
+ if(verbose) message(" Probe stratum ", strata, " of ", length(index.list)) |
|
721 | 721 |
gender <- object$gender |
722 | 722 |
enough.males <- sum(gender==1) > MIN.SAMPLES |
723 | 723 |
enough.females <- sum(gender==2) > MIN.SAMPLES |
... | ... |
@@ -879,7 +879,7 @@ fit.lm4 <- function(strata, |
879 | 879 |
message(paste("fewer than", MIN.SAMPLES, "men and women. Copy number not estimated for CHR X")) |
880 | 880 |
return(object) |
881 | 881 |
} |
882 |
- if(verbose) message("Probe stratum ", strata, " of ", length(index.list)) |
|
882 |
+ if(verbose) message(" Probe stratum ", strata, " of ", length(index.list)) |
|
883 | 883 |
marker.index <- index.list[[strata]] |
884 | 884 |
batches <- split(seq_along(batch(object)), as.character(batch(object))) |
885 | 885 |
batches <- batches[sapply(batches, length) >= MIN.SAMPLES] |
... | ... |
@@ -1396,7 +1396,7 @@ whichMarkers <- function(type, is.snp, is.autosome, is.annotated, is.X){ |
1396 | 1396 |
summarizeNps <- function(strata, index.list, object, batchSize, |
1397 | 1397 |
GT.CONF.THR, verbose, is.lds, CHR.X, ...){ |
1398 | 1398 |
if(is.lds) {physical <- get("physical"); open(object)} |
1399 |
- if(verbose) message("Probe stratum ", strata, " of ", length(index.list)) |
|
1399 |
+ if(verbose) message(" Probe stratum ", strata, " of ", length(index.list)) |
|
1400 | 1400 |
index <- index.list[[strata]] |
1401 | 1401 |
if(CHR.X) { |
1402 | 1402 |
sample.index <- which(object$gender==2) |
... | ... |
@@ -1449,7 +1449,7 @@ summarizeSnps <- function(strata, |
1449 | 1449 |
physical <- get("physical") |
1450 | 1450 |
open(object) |
1451 | 1451 |
} |
1452 |
- if(verbose) message("Probe stratum ", strata, " of ", length(index.list)) |
|
1452 |
+ if(verbose) message(" Probe stratum ", strata, " of ", length(index.list)) |
|
1453 | 1453 |
index <- index.list[[strata]] |
1454 | 1454 |
## if(CHR.X) { |
1455 | 1455 |
## sample.index <- which(object$gender==2) |