Browse code

Attempt in fixing #363.

Markus Riester authored on 24/04/2024 18:43:56
Showing 1 changed files

... ...
@@ -436,6 +436,7 @@ plot.cnv = TRUE, max.segments = NULL, min.logr.sdev = 0.15, chr.hash = chr.hash)
436 436
 }
437 437
 
438 438
 .getAverageWeightPV <- function(seg, weights, perm = 2000) {
439
+    perm <- min(length(weights), 2000)
439 440
     num_marks <- sort(unique(seg$num.mark))
440 441
     .do_permutation <- function(i, l) {
441 442
         if (l > 25) return(0)