1 Introduction

Rqc is an optimized tool designed for quality control and assessment of high-throughput sequencing data. It performs parallel processing of entire files and produces a report which contains a set of high-resolution graphics that can be used for quality assessment.

This version of Rqc produces high-quality images for the following statistics:

  • Average Quality: this plot describes the average quality pattern by showing on the X-axis quality thresholds and on the Y-axis the percentage of reads that exceed that quality level.
  • Cycle-specific Average Quality: this describes the average quality scores for each cycle of sequencing.
  • Read Length Distribution: this is a barplot that presents the distribuition of the lengths of the reads available in the FASTQ file.
  • Cycle-specific GC Content: a line plot showing the average GC content for every cycle of sequencing.
  • Cycle-specific Quality Distribution: a bar plot showing the proportion of quality calls per cycle. Colors are presented in a gradient Red-Blue, where red identifies calls of lower quality. This visualization is preferred as it is cleaner than the boxplots described below.
  • Cycle-specific Quality Distribution - Boxplots: boxplots describing empirical patterns of quality distribution on each cycle of sequencing.
  • Cycle-specific Base Call Proportion: this bar plot describes the proportion of each nucleotide called for every cycle of sequencing.

1.1 Basic Workflow

The main goal of Rqc is to provide graphical tools for quality assessment of reads contained in FASTQ files. This package is designed focusing on simplicity of use. Therefore, the Rqc package allows the user to call one single function called rqc. The rqc method processes a set of input files and generates an HTML report containing several plots that can be used for quality assessment.

To access this functionality, the user needs to load Rqc package.

library(Rqc)

The next step is to determine the location of the FASTQ files that should be analyzed. The example below, uses sample files provided by the ShortRead package, but the user must modify this location accordingly, in order to reflect the actual location of the files that need QA.

folder <- system.file(package="ShortRead", "extdata/E-MTAB-1147")

The basic usage of the rqc function requires the definition of 2 arguments. One, path, is the location where the files of interest are saved at (this was defined on the step above). The other argument, pattern, is a regular expression that identifies all files of interest. Below, we use .fastq.gz to specify that all files containing that string are to be processed.

rqc(path = folder, pattern = ".fastq.gz")

At this point, the user’s default Internet browser will open an HTML file. This file is the report generated by Rqc, which, by default, is stored in a temporary directory. A sample report is shown below:


2 Quality control report

2.1 File Information

This table describes input files. reads column can be total number of reads (sample=FALSE) or sample size.

knitr::kable(perFileInformation(qa))
filename pair format group reads total.reads path
ERR127302_1_subset.fastq.gz 1 FASTQ None 20000 20000 /home/biocbuild/bbs-3.16-bioc/R/library/ShortRead/extdata/E-MTAB-1147
ERR127302_2_subset.fastq.gz 2 FASTQ None 20000 20000 /home/biocbuild/bbs-3.16-bioc/R/library/ShortRead/extdata/E-MTAB-1147

2.2 Per Read Mean Quality Distribution of Files

This plot describe an overview of per read mean quality distribution of all files

rqcReadQualityBoxPlot(qa)

2.3 Average Quality

This plot describes the average quality pattern by showing on the X-axis quality thresholds and on the Y-axis the percentage of reads that exceed that quality level.

rqcReadQualityPlot(qa)

2.4 Cycle-specific Average Quality

This describes the average quality scores for each cycle of sequencing.

rqcCycleAverageQualityPlot(qa)

2.5 Read Frequency

This plot shows the proportion of reads that appeared many times.

rqcReadFrequencyPlot(qa)

2.6 Heatmap of top represented reads

This heatmap plot shows dstance matrix between top represented reads. This functon only works with one result file (and not a list).

rqcFileHeatmap(qa[[1]])

2.7 Read Length Distribution

Barplot that presents the distribuition of the lengths of the reads available in the FASTQ file.

rqcReadWidthPlot(qa)

2.8 Cycle-specific GC Content

Line plot showing the average GC content for every cycle of sequencing.

rqcCycleGCPlot(qa)

2.9 Cycle-specific Quality Distribution

Bar plot showing the proportion of quality calls per cycle. Colors are presented in a gradient Red-Blue, where red identifies calls of lower quality. This visualization is preferred as it is cleaner than the boxplots described below.

rqcCycleQualityPlot(qa)

2.10 PCA Biplot (cycle-specific read average quality)

Biplot from Principal Component Analysis (PCA) of cycle-specific read average quality.

rqcCycleAverageQualityPcaPlot(qa)
## Warning: geom_hline(): Ignoring `mapping` because `yintercept` was provided.
## Warning: geom_vline(): Ignoring `mapping` because `xintercept` was provided.

2.11 Cycle-specific Quality Distribution - Boxplot

Boxplots describing empirical patterns of quality distribution on each cycle of sequencing.

rqcCycleQualityBoxPlot(qa)

2.12 Cycle-specific Base Call Proportion

This bar plot describes the proportion of each nucleotide called for every cycle of sequencing.

rqcCycleBaseCallsPlot(qa)

The line plot shows a more detailed view.

rqcCycleBaseCallsLinePlot(qa)


It is important to note that the rqc function samples 1 million records from the FASTQ files. This can be set by adjusting the n argument for this function. If the user desires to have the file processed as a whole (rather than sampling records from it), (s)he must set the argument sample to FALSE.

3 Advanced Workflow

The rqc function wraps a set of functions to generate a quick report that can be used for quality assessment. However, users can perform a step-by-step analysis by using the information described below.

3.1 Defining input files

If one wants to process a set of files that are not located at the same directory, the users needs to create a vector containing the absolute path of files. The list.files function can be useful.

fastqDir <- system.file(package="ShortRead", "extdata/E-MTAB-1147")
files <- list.files(fastqDir, "fastq.gz", full.names=TRUE)

The example input files are samples from a public data set. These samples are available through the ShortRead package. More information regarding these data can be found on the vignette of that package.

3.2 Processing files

To process the files without generating an HTML report, the user should use rqcQA function instead rqc. This function receives a vector containing the paths of the input files.

qa <- rqcQA(files, workers=1)

The rqcQA function returns a list that contains the required information to create the plots present on the standard HTML report. Actually, both rqc and rqcQA return a named list of RqcResultSet objects. This output can be used directly as input to other Rqc package functions. Examples of functions that can use these objects are rqcReport and plot. RqcResultSet is a class that extends .QA class of ShortRead package. An RqcResultSet object contains information in two different perspectives: read-specific data and cycle-specific data. They can be accessed using [[ brackets.

3.3 Generating report

To create a final HTML report, the user can apply the rqcReport function to the qa object.

reportFile <- rqcReport(qa)
browseURL(reportFile)

The report generated by rqcReport contains the all plots described on the beginning of this document. By default, it is written to a temporary directory. This behavior can by modified by setting the outdir argument.

4 Parallel processing

The Rqc package performs parallel processing of the samples by interfacing with the BiocParallel package. By default, Rqc calls multicoreWorkers function that returns the maximum number of workers available. You can change the number of cores setting workers parameter on rqc and rqcQA functions. It is possible to process the input files serially by setting workers=1.

5 Graphics

For each plot generated by Rqc, there is a function that shapes the data appropriately. The shaped information is then used to produce the final plot. The example below shows how the user can access these data to generate plots using other tools.

df <- rqcCycleAverageQualityCalc(qa)
cycle <- as.numeric(levels(df$cycle))[df$cycle]
plot(cycle, df$quality, col = df$filename, xlab='Cycle', ylab='Quality Score')

One can also process a subset of result data using subsets of a list.

sublist <- qa[1]
rqcCycleQualityPlot(sublist)

6 Writing personalized quality control reports

Rqc package accepts R Markdown file format as template file for generating custom reports. Markdown is a markup language for web development. R Markdown files are regular Markdown files with R codes. Every chunk of code is executed during compilation done by knitr package. Knitr takes R Markdown file and generates Markdown file merged with R codes and their outputs such as text, tables and figures. Result Markdown file is used by Rqc for generating final report in HTML or PDF formats. The source file of Rqc’s default report is a good reference for writing new template reports. Run code below returns the system file path to this source file.

system.file(package = "Rqc", "templates", "rqc_report.Rmd") 

Basic concepts for writing Markdown documents with R code are available at http://rmarkdown.rstudio.com/. Advanced concepts about the compilation process of R Markdown files are available at http://yihui.name/knitr/. The Bioconductor project provides style guidelines for HTML documents at http://www.bioconductor.org/packages/release/bioc/vignettes/BiocStyle/inst/doc/HtmlStyle.html.

Rqc result data is available inside template files through rqcResultSet object. This object is a list of summarized statistics about input files and it is used by all accessor functions and plots provided by Rqc package. The rqcReport function takes template file path as argument and generates personalized reports.

rqcReport(qa, templateFile = "custom_report.Rmd") 

7 Final Considerations

The Rqc package provides a simple interface to generate plots often used for quality assessment of high-throughput sequencing data. It uses the standard Bioconductor parallelization framework to add efficiency to data processing. The images produced by the package are high-quality figures that can be directly used on publications.

8 Session Information

## R version 4.2.1 (2022-06-23)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.5 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.16-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.16-bioc/R/lib/libRlapack.so
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_GB              LC_COLLATE=C              
##  [5] LC_MONETARY=en_US.UTF-8    LC_MESSAGES=en_US.UTF-8   
##  [7] LC_PAPER=en_US.UTF-8       LC_NAME=C                 
##  [9] LC_ADDRESS=C               LC_TELEPHONE=C            
## [11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C       
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] Rqc_1.32.0                  ggplot2_3.3.6              
##  [3] ShortRead_1.56.0            GenomicAlignments_1.34.0   
##  [5] SummarizedExperiment_1.28.0 Biobase_2.58.0             
##  [7] MatrixGenerics_1.10.0       matrixStats_0.62.0         
##  [9] Rsamtools_2.14.0            GenomicRanges_1.50.0       
## [11] Biostrings_2.66.0           GenomeInfoDb_1.34.0        
## [13] XVector_0.38.0              IRanges_2.32.0             
## [15] S4Vectors_0.36.0            BiocGenerics_0.44.0        
## [17] BiocParallel_1.32.0         BiocStyle_2.26.0           
## 
## loaded via a namespace (and not attached):
##   [1] backports_1.4.1          Hmisc_4.7-1              BiocFileCache_2.6.0     
##   [4] plyr_1.8.7               lazyeval_0.2.2           splines_4.2.1           
##   [7] digest_0.6.30            ensembldb_2.22.0         htmltools_0.5.3         
##  [10] magick_2.7.3             fansi_1.0.3              magrittr_2.0.3          
##  [13] checkmate_2.1.0          memoise_2.0.1            BSgenome_1.66.0         
##  [16] cluster_2.1.4            prettyunits_1.1.1        jpeg_0.1-9              
##  [19] colorspace_2.0-3         blob_1.2.3               rappdirs_0.3.3          
##  [22] xfun_0.34                dplyr_1.0.10             crayon_1.5.2            
##  [25] RCurl_1.98-1.9           jsonlite_1.8.3           survival_3.4-0          
##  [28] VariantAnnotation_1.44.0 glue_1.6.2               gtable_0.3.1            
##  [31] zlibbioc_1.44.0          DelayedArray_0.24.0      scales_1.2.1            
##  [34] DBI_1.1.3                Rcpp_1.0.9               xtable_1.8-4            
##  [37] progress_1.2.2           htmlTable_2.4.1          foreign_0.8-83          
##  [40] bit_4.0.4                Formula_1.2-4            htmlwidgets_1.5.4       
##  [43] httr_1.4.4               RColorBrewer_1.1-3       ellipsis_0.3.2          
##  [46] pkgconfig_2.0.3          XML_3.99-0.12            farver_2.1.1            
##  [49] nnet_7.3-18              sass_0.4.2               dbplyr_2.2.1            
##  [52] deldir_1.0-6             utf8_1.2.2               tidyselect_1.2.0        
##  [55] labeling_0.4.2           rlang_1.0.6              reshape2_1.4.4          
##  [58] later_1.3.0              AnnotationDbi_1.60.0     munsell_0.5.0           
##  [61] tools_4.2.1              cachem_1.0.6             cli_3.4.1               
##  [64] generics_0.1.3           RSQLite_2.2.18           evaluate_0.17           
##  [67] stringr_1.4.1            fastmap_1.1.0            yaml_2.3.6              
##  [70] knitr_1.40               bit64_4.0.5              KEGGREST_1.38.0         
##  [73] AnnotationFilter_1.22.0  mime_0.12                xml2_1.3.3              
##  [76] biomaRt_2.54.0           compiler_4.2.1           rstudioapi_0.14         
##  [79] filelock_1.0.2           curl_4.3.3               png_0.1-7               
##  [82] tibble_3.1.8             bslib_0.4.0              stringi_1.7.8           
##  [85] highr_0.9                GenomicFeatures_1.50.0   GenomicFiles_1.34.0     
##  [88] lattice_0.20-45          ProtGenerics_1.30.0      Matrix_1.5-1            
##  [91] markdown_1.3             vctrs_0.5.0              pillar_1.8.1            
##  [94] lifecycle_1.0.3          BiocManager_1.30.19      jquerylib_0.1.4         
##  [97] data.table_1.14.4        bitops_1.0-7             httpuv_1.6.6            
## [100] rtracklayer_1.58.0       R6_2.5.1                 BiocIO_1.8.0            
## [103] latticeExtra_0.6-30      hwriter_1.3.2.1          bookdown_0.29           
## [106] promises_1.2.0.1         gridExtra_2.3            codetools_0.2-18        
## [109] dichromat_2.0-0.1        assertthat_0.2.1         rjson_0.2.21            
## [112] withr_2.5.0              GenomeInfoDbData_1.2.9   parallel_4.2.1          
## [115] hms_1.1.2                grid_4.2.1               rpart_4.1.19            
## [118] rmarkdown_2.17           biovizBase_1.46.0        shiny_1.7.3             
## [121] base64enc_0.1-3          interp_1.1-3             restfulr_0.0.15