... | ... |
@@ -71,8 +71,8 @@ checkpointsEnabled <- function() |
71 | 71 |
#' resultC <- CoGAPS(GIST.data_frame, params, nIterations=25) |
72 | 72 |
#' @importFrom methods new is |
73 | 73 |
CoGAPS <- function(data, params=new("CogapsParams"), nThreads=1, messages=TRUE, |
74 |
-outputFrequency=500, uncertainty=NULL, checkpointOutFile="gaps_checkpoint.out", |
|
75 |
-checkpointInterval=1000, checkpointInFile=NULL, transposeData=FALSE, |
|
74 |
+outputFrequency=2500, uncertainty=NULL, checkpointOutFile="gaps_checkpoint.out", |
|
75 |
+checkpointInterval=0, checkpointInFile=NULL, transposeData=FALSE, |
|
76 | 76 |
BPPARAM=NULL, workerID=1, ...) |
77 | 77 |
{ |
78 | 78 |
# pre-process inputs |
... | ... |
@@ -92,7 +92,7 @@ setMethod("initialize", "CogapsParams", |
92 | 92 |
.Object@distributed <- distributed |
93 | 93 |
|
94 | 94 |
.Object@nPatterns <- 7 |
95 |
- .Object@nIterations <- 1000 |
|
95 |
+ .Object@nIterations <- 5000 |
|
96 | 96 |
.Object@alphaA <- 0.01 |
97 | 97 |
.Object@alphaP <- 0.01 |
98 | 98 |
.Object@maxGibbsMassA <- 100 |