NAMESPACE
687883a0
 useDynLib("crlmm", .registration=TRUE)
7c0c9ac5
 
ad3cc706
 importClassesFrom(Biobase, AssayData, eSet)
 
3ad9a188
 ##importClassesFrom(methods, ANY, character, formula, integer, list,
 ##                  matrix, oldClass)
 ##importMethodsFrom(methods, initialize, show)
 import(methods)
 ##importFrom(methods, setOldClass)
 ##importFrom(methods, as, callNextMethod, is, new, validObject)
 ##importFrom(methods, callNextMethod, new, validObject, coerce)
 
a3b625d4
 importFrom(RcppEigen, fastLmPure)
ad3cc706
 ## importClassesFrom(oligoClasses, CNSet, CNSetLM, ff_matrix,
 ##                   ff_or_matrix, oligoSnpSet)
cbfc52e5
 importClassesFrom(oligoClasses, CNSet, oligoSnpSet, ff_or_matrix, GenomeAnnotatedDataFrame)
ad3cc706
 ##setOldClass(ff_or_matrix)
3ad9a188
 import(matrixStats)
ad3cc706
 
 importMethodsFrom(Biobase, annotatedDataFrameFrom, annotation,
c27ba9c5
                   AnnotatedDataFrame, assayData, experimentData, featureData,
ad3cc706
                   "featureData<-", featureNames, "featureNames<-",
                   pData, "pData<-", phenoData, "phenoData<-",
3ad9a188
                   protocolData, "protocolData<-",
ad3cc706
                   sampleNames, snpCall, "snpCall<-",
                   snpCallProbability, "snpCallProbability<-",
                   storageMode, "storageMode<-", varLabels)
 
 importMethodsFrom(BiocGenerics, cbind, colnames, Filter, get,
                   intersect, lapply, ncol, NCOL, nrow, NROW, order,
                   paste, pmax, pmin, rbind, rownames, sapply, setdiff,
                   table, union, unique)
 
3ad9a188
 ##importMethodsFrom(genefilter, show)
ad3cc706
 
 importMethodsFrom(oligoClasses, A, "A<-", B, batch, batchNames,
                   batchStatistics, "batchStatistics<-", calls,
                   chromosome, close, confs, flags, isSnp, mean, nu,
                   open, phi, "sampleNames<-")
 
 importFrom(affyio, read.celfile, read.celfile.header)
 
3ad9a188
 importFrom(illuminaio, readIDAT)
 
ad3cc706
 importFrom(Biobase, assayDataElement, assayDataElementReplace,
            assayDataNew, copyEnv)
 
38fb1b80
 importFrom(ellipse, ellipse)
ad3cc706
 
3ad9a188
 ##importFrom(genefilter, rowSds)
ad3cc706
 
 importFrom(lattice, lpolygon, panel.grid, panel.number, panel.xyplot,
            xyplot)
 
2a5b6e2d
 ##importFrom(methods, as, callNextMethod, is, new, validObject)
ad3cc706
 
 importFrom(mvtnorm, rmvnorm)
 
 importFrom(oligoClasses, celfileDate, chromosome2integer, i2p,
            initializeBigMatrix, initializeBigVector, integerMatrix,
b2cf0c8e
            isPackageLoaded, ldPath, ocLapply, ocProbesets, ocSamples,
            parStatus, splitIndicesByLength, splitIndicesByNode, 
            AssayDataList, genomeBuild, celfileName)
ad3cc706
 
808cfecc
 importFrom(preprocessCore, normalize.quantiles, normalize.quantiles.determine.target,
a3b625d4
            normalize.quantiles.use.target, subColSummarizeMedian)
ad3cc706
 
 importFrom(stats, coef, cov, dnorm, kmeans, lm, mad, median, quantile,
            sd)
 
 importFrom(utils, packageDescription, setTxtProgressBar,
            txtProgressBar)
af08b5d6
 
cbfc52e5
 importFrom(graphics, plot, smoothScatter, abline)
 
 importFrom(beanplot, beanplot)
 
063b3d14
 ## foreach
 import(foreach)
 
ba1a7d73
 importFrom(VGAM, vglm, multinomial, coefficients)
 
cbfc52e5
 importFrom(parallel, makeCluster, detectCores, parRapply, stopCluster, clusterEvalQ, parCapply)
987f58fd
 
cbfc52e5
 importFrom(limma, loessFit)
987f58fd
 
b2cf0c8e
 importFrom(ff, delete)
 
c7e3c05f
 ##----------------------------------------------------------------------------
 ## export
 ##----------------------------------------------------------------------------
 exportClasses(PredictionRegion)
063b3d14
 exportMethods(CA, CB,
c7e3c05f
 	      A, B, corr, nuA, nuB, phiA, phiB,
 	      predictionRegion, posteriorProbability,
 	      tau2, Ns, medians, mads,
3ad9a188
 	      xyplot, calculateRBaf, OligoSetList,
 	      BafLrrSetList)
0198a9ad
 export(crlmm,
        crlmmIllumina,
e31c7794
        constructAffyCNSet,
0198a9ad
        genotype,
e31c7794
        genotypeAffy,
0198a9ad
        readIdatFiles,
51201412
        readGenCallOutput,
f0da6921
        snprma,
        snprma2,
e31c7794
        cnrmaAffy,
        snprmaAffy,
d5bc779e
        crlmm2,
3e4db4b1
        genotype2, genotypeLD,
e31c7794
        genotypeAffy,
6e826f6a
        genotype.Illumina,
cbfc52e5
        plotSamples, plotSNPs,
3e4db4b1
        crlmmCopynumber2, crlmmCopynumberLD, crlmmCopynumber)
82cb251d
 export(genotypes, totalCopynumber, rawCopynumber, xyplot)
063b3d14
 export(ABpanel, validCEL, celDates, validCdfNames)
3ad9a188
 
 ##export(constructOligoSetListFrom, constructBafLrrSetListFrom)