... | ... |
@@ -223,7 +223,7 @@ interval.padding = 50, DB.info.flag = "DB") { |
223 | 223 |
} |
224 | 224 |
if (!is.null(info(vcf)[[DB.info.flag]]) && |
225 | 225 |
sum(info(vcf)[[DB.info.flag]]) < nrow(vcf) / 2) { |
226 |
- flog.warn("Less than half of variants are likely somatic. Make sure that VCF %s", |
|
226 |
+ flog.warn("Less than half of variants are annoted as germline database member. Make sure that VCF %s", |
|
227 | 227 |
"contains both germline and somatic variants.") |
228 | 228 |
} |
229 | 229 |
|
... | ... |
@@ -523,7 +523,7 @@ function(vcf, tumor.id.in.vcf, allowed = 0.05) { |
523 | 523 |
newInfo <- DataFrame( |
524 | 524 |
Number = 0, |
525 | 525 |
Type = "Flag", |
526 |
- Description = "Likely somatic status, based on SOMATIC or Cosmic.CNT info fields, population allele frequency, or dbSNP membership", |
|
526 |
+ Description = "Likely somatic status, based on SOMATIC or Cosmic.CNT info fields, population allele frequency, or germline database membership", |
|
527 | 527 |
row.names = DB.info.flag) |
528 | 528 |
info(header(vcf)) <- rbind(info(header(vcf)), newInfo) |
529 | 529 |
info(vcf)[[DB.info.flag]] <- db |
... | ... |
@@ -80,7 +80,7 @@ readAllelicCountsFile <- function(file, format, zero=NULL) { |
80 | 80 |
info(header(vcf)) <- DataFrame( |
81 | 81 |
Number = "0", |
82 | 82 |
Type = "Flag", |
83 |
- Description = "Likely somatic status, based on SOMATIC or Cosmic.CNT info fields, population allele frequency, or dbSNP membership", |
|
83 |
+ Description = "Likely somatic status, based on SOMATIC or Cosmic.CNT info fields, population allele frequency, or germline database membership", |
|
84 | 84 |
row.names = "DB") |
85 | 85 |
|
86 | 86 |
geno(header(vcf)) <- DataFrame( |
... | ... |
@@ -29,7 +29,7 @@ |
29 | 29 |
#' @param vcf.file VCF file. |
30 | 30 |
#' Optional, but typically needed to select between local optima of similar |
31 | 31 |
#' likelihood. Can also be a \code{CollapsedVCF}, read with the \code{readVcf} |
32 |
-#' function. Requires a DB info flag for likely somatic status. The default |
|
32 |
+#' function. Requires a DB info flag for likely germline status. The default |
|
33 | 33 |
#' \code{fun.setPriorVcf} function will also look for a Cosmic.CNT slot (see |
34 | 34 |
#' \code{cosmic.vcf.file}), containing the hits in the COSMIC database. Again, |
35 | 35 |
#' do not expect very useful results without a VCF file. |
... | ... |
@@ -60,14 +60,14 @@ setPriorVcf <- function(vcf, prior.somatic = c(0.5, 0.0005, 0.999, 0.0001, |
60 | 60 |
if (!is.null(info(vcf)[[Cosmic.CNT.info.field]])) { |
61 | 61 |
flog.info("Found COSMIC annotation in VCF. Requiring %i hits.", |
62 | 62 |
min.cosmic.cnt) |
63 |
- flog.info("Setting somatic prior probabilities for hits to %f or to %f if in both COSMIC and likely somatic based on dbSNP membership or population allele frequency.", |
|
63 |
+ flog.info("Setting somatic prior probabilities for hits to %f or to %f if in both COSMIC and likely germline based on dbSNP membership or population allele frequency.", |
|
64 | 64 |
tmp[5], tmp[6]) |
65 | 65 |
|
66 | 66 |
prior.somatic[which(info(vcf)[[Cosmic.CNT.info.field]] >= min.cosmic.cnt)] <- tmp[5] |
67 | 67 |
prior.somatic[which(info(vcf)[[Cosmic.CNT.info.field]] >= min.cosmic.cnt & |
68 | 68 |
info(vcf)[[DB.info.flag]])] <- tmp[6] |
69 | 69 |
} else { |
70 |
- flog.info("Setting somatic prior probabilities for likely somatic hits to %f or to %f otherwise.", |
|
70 |
+ flog.info("Setting somatic prior probabilities for likely germline hits to %f or to %f otherwise.", |
|
71 | 71 |
tmp[2], tmp[1]) |
72 | 72 |
} |
73 | 73 |
} |
... | ... |
@@ -105,7 +105,7 @@ option_list <- list( |
105 | 105 |
help = "Maximum considered ploidy [default %default]"), |
106 | 106 |
make_option(c("--max-copy-number"), action = "store", type = "double", |
107 | 107 |
default = max(eval(formals(PureCN::runAbsoluteCN)$test.num.copy)), |
108 |
- help = "Maximum allele-specific integer copy number, only used for fitting allele-specific copy numbers. Higher copy numbers might still be inferred and reported [default %default]"), |
|
108 |
+ help = "Maximum allele-specific integer copy number, only used for fitting allele-specific copy numbers. Higher copy numbers are still be inferred and reported [default %default]"), |
|
109 | 109 |
make_option(c("--post-optimize"), action = "store_true", default = FALSE, |
110 | 110 |
help = "Post-optimization [default %default]"), |
111 | 111 |
make_option(c("--bootstrap-n"), action = "store", type = "integer", default = 0, |
... | ... |
@@ -7,9 +7,9 @@ |
7 | 7 |
filterVcfMuTect2( |
8 | 8 |
vcf, |
9 | 9 |
tumor.id.in.vcf = NULL, |
10 |
- ignore = c("clustered_events", "t_lod", "str_contraction", "read_position", "position", |
|
11 |
- "fragment_length", "multiallelic", "clipping", "strand_artifact", "strand_bias", |
|
12 |
- "slippage", "weak_evidence", "orientation", "haplotype"), |
|
10 |
+ ignore = c("clustered_events", "t_lod", "str_contraction", "read_position", |
|
11 |
+ "position", "fragment_length", "multiallelic", "clipping", "strand_artifact", |
|
12 |
+ "strand_bias", "slippage", "weak_evidence", "orientation", "haplotype"), |
|
13 | 13 |
... |
14 | 14 |
) |
15 | 15 |
} |
... | ... |
@@ -98,7 +98,7 @@ deviation, used to model likelihood of sub-clonal copy number events.} |
98 | 98 |
\item{vcf.file}{VCF file. |
99 | 99 |
Optional, but typically needed to select between local optima of similar |
100 | 100 |
likelihood. Can also be a \code{CollapsedVCF}, read with the \code{readVcf} |
101 |
-function. Requires a DB info flag for likely somatic status. The default |
|
101 |
+function. Requires a DB info flag for likely germline status. The default |
|
102 | 102 |
\code{fun.setPriorVcf} function will also look for a Cosmic.CNT slot (see |
103 | 103 |
\code{cosmic.vcf.file}), containing the hits in the COSMIC database. Again, |
104 | 104 |
do not expect very useful results without a VCF file.} |