git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/crlmm@53575 bc3139a8-67e5-0310-9ffc-ced21a209358
... | ... |
@@ -1,7 +1,7 @@ |
1 | 1 |
Package: crlmm |
2 | 2 |
Type: Package |
3 | 3 |
Title: Genotype Calling (CRLMM) and Copy Number Analysis tool for Affymetrix SNP 5.0 and 6.0 and Illumina arrays. |
4 |
-Version: 1.9.15 |
|
4 |
+Version: 1.9.16 |
|
5 | 5 |
Date: 2010-12-10 |
6 | 6 |
Author: Benilton S Carvalho <Benilton.Carvalho@cancer.org.uk>, Robert Scharpf <rscharpf@jhsph.edu>, Matt Ritchie <mritchie@wehi.edu.au>, Ingo Ruczinski <iruczins@jhsph.edu>, Rafael A Irizarry |
7 | 7 |
Maintainer: Benilton S Carvalho <Benilton.Carvalho@cancer.org.uk>, Robert Scharpf <rscharpf@jhsph.edu>, Matt Ritchie <mritchie@wehi.EDU.AU> |
... | ... |
@@ -554,7 +554,10 @@ fit.lm1 <- function(strata, |
554 | 554 |
## Grand mean |
555 | 555 |
## |
556 | 556 |
##--------------------------------------------------------------------------- |
557 |
- if(length(batches) > 1 && "grandMean" %in% batchNames(object)){ |
|
557 |
+## if(length(batches) > 1 && "grandMean" %in% batchNames(object)){ |
|
558 |
+ ## TODO: There are NA's in the medianA.AA for the grandMean and 0's in the madA |
|
559 |
+ ## - both need to be handled prior to estimating a grand intercept and slope |
|
560 |
+ if(FALSE){ |
|
558 | 561 |
## then the last column is for the grandMean |
559 | 562 |
k <- ncol(medianA.AA) |
560 | 563 |
medianA <- cbind(medianA.AA[, k], medianA.AB[, k], medianA.BB[, k]) |
... | ... |
@@ -562,8 +565,8 @@ fit.lm1 <- function(strata, |
562 | 565 |
madA <- cbind(madA.AA[, k], madA.AB[, k], madA.BB[, k]) |
563 | 566 |
madB <- cbind(madB.AA[, k], madB.AB[, k], madB.BB[, k]) |
564 | 567 |
NN <- cbind(N.AA[, k], N.AB[, k], N.BB[, k]) |
565 |
- ##index <- which(rowSums(is.na(medianA)) > 0) |
|
566 |
- res <- fit.wls(NN=NN, sigma=madA, allele="A", Y=medianA, autosome=!CHR.X) |
|
568 |
+ index <- which(rowSums(is.na(medianA)) == 0) |
|
569 |
+ res <- fit.wls(NN=NN[index, ], sigma=madA[index, ], allele="A", Y=medianA[index, ], autosome=!CHR.X) |
|
567 | 570 |
nuA[, k] <- res[1, ] |
568 | 571 |
phiA[, k] <- res[2, ] |
569 | 572 |
rm(res) |
... | ... |
@@ -1738,6 +1741,9 @@ summarizeSnps <- function(strata, |
1738 | 1741 |
corrAA[, k] <- rowCors(AA*G.AA, BB*G.AA, na.rm=TRUE) |
1739 | 1742 |
corrAB[, k] <- rowCors(AA*G.AB, BB*G.AB, na.rm=TRUE) |
1740 | 1743 |
corrBB[, k] <- rowCors(AA*G.BB, BB*G.BB, na.rm=TRUE) |
1744 |
+ ## |
|
1745 |
+ ## TODO: fill in NAs -- use code from shrinkGenotypeSummaries |
|
1746 |
+ ## |
|
1741 | 1747 |
rm(GG, CP, AA, BB, FL, stats) |
1742 | 1748 |
gc() |
1743 | 1749 |
} |