Skip to content

Commit

Permalink
fix #532 knitr parsing
Browse files Browse the repository at this point in the history
  • Loading branch information
c-mertes committed Apr 17, 2024
1 parent 3b34f53 commit ec9628f
Show file tree
Hide file tree
Showing 4 changed files with 6 additions and 6 deletions.
2 changes: 1 addition & 1 deletion drop/modules/mae-pipeline/MAE/Results.R
Original file line number Diff line number Diff line change
Expand Up @@ -107,7 +107,7 @@ res[, MAE_ALT := MAE == TRUE & altRatio >= allelicRatioCutoff]
#'
#' Number of samples with significant MAE for alternative events: `r uniqueN(res[MAE_ALT == TRUE, ID])`

#+echo=F
#+ echo=F

# Save full results zipped
res[, altRatio := round(altRatio, 3)]
Expand Down
2 changes: 1 addition & 1 deletion drop/modules/mae-pipeline/QC/DNA_RNA_matrix_plot.R
Original file line number Diff line number Diff line change
Expand Up @@ -12,7 +12,7 @@
#' type: noindex
#'---

#+echo=F
#+ echo=F
saveRDS(snakemake, snakemake@log$snakemake)

suppressPackageStartupMessages({
Expand Down
4 changes: 2 additions & 2 deletions drop/template/Scripts/MonoallelicExpression/Overview.R
Original file line number Diff line number Diff line change
Expand Up @@ -86,7 +86,7 @@ qc_links <- sapply(qc_groups, function(v) build_link_list(
#'

#' ## Analyze Individual Results
#+echo=FALSE
#+ echo=FALSE
# Read the first results table
res_sample <- readRDS(snakemake@input$results_sample[[1]])
sample <- unique(res_sample$ID)
Expand All @@ -95,7 +95,7 @@ library(tMAE)
library(ggplot2)
rare_column <- 'rare'
if(any(is.na(res_sample$rare))) rare_column <- NULL
#+echo=TRUE
#+ echo=TRUE

#' ### MA plot: fold change vs RNA coverage
plotMA4MAE(res_sample, rare_column = rare_column,
Expand Down
4 changes: 2 additions & 2 deletions drop/template/Scripts/Pipeline/SampleAnnotation.R
Original file line number Diff line number Diff line change
Expand Up @@ -16,7 +16,7 @@
#' code_download: TRUE
#'---

#+echo=F
#+ echo=F
saveRDS(snakemake, snakemake@log$snakemake)

suppressPackageStartupMessages({
Expand Down Expand Up @@ -76,7 +76,7 @@ unique(sa[,.(RNA_ID, DROP_GROUP)])$DROP_GROUP %>% strsplit(',') %>% unlist %>%
table %>% barplot(xlab = 'DROP groups', ylab = 'Number of samples')

# Obtain genes that overlap with HPO terms
#+echo=F
#+ echo=F
if(!is.null(sa$HPO_TERMS) & !all(is.na(sa$HPO_TERMS)) & ! all(sa$HPO_TERMS == '')){
sa2 <- sa[, .SD[1], by = RNA_ID]

Expand Down

0 comments on commit ec9628f

Please sign in to comment.