Browse code

Retain exon.lrs

chanf10_roche authored on 06/12/2023 19:17:17
Showing 1 changed files

... ...
@@ -1154,6 +1154,7 @@ runAbsoluteCN <- function(normal.coverage.file = NULL,
1154 1154
             mapping.bias.rho = if (is.null(rho) || all(is.na(rho))) NULL else mean(rho, na.rm = TRUE),
1155 1155
             vcf.field.prefix = vcf.field.prefix,
1156 1156
             interval.file = interval.file,
1157
+            exon.lrs = exon.lrs,
1157 1158
             args = list(
1158 1159
                 filterVcf = args.filterVcf[vapply(args.filterVcf, object.size, double(1)) < 1000],
1159 1160
                 filterIntervals = args.filterIntervals[vapply(args.filterIntervals, object.size, double(1)) < 1000])