This vignette introduces the package Bioconductor package CSSQ. This package is designed to perform differential binding analysis for ChIP-seq samples. Differential binding is when there is a significant difference in the signal intensities at a region between two groups. The idea behind CSSQ is to implement a statistically robust pipeline which is built for ChIP-seq datasets to identify regions of differential binding among a set of interesting regions. It contains functions to quantify the signal over a predefined set of regions from the user, transform the data, normalize across samples and perform statistical tests to determine differential binding. There is an ever-increasing number of ChIP-seq samples, and this opens the door to compare these binding events between two groups of samples. CSSQ does this while considering the signal to noise ratios, paired control experiments and the lack of multiple (>2) replicates in a typical ChIP-seq experiment. It controls the false discovery rates while not compromising in its sensitivity. This document will give a brief overview of the processing steps.
The workflow for CSSQ is as follows
To use CSSQ, you will require a bed file containing the regions of interest as well as sample information file which contains the necessary information about the samples being analyzed. Below are examples of both files.  
library(CSSQ)
regionBed <- read.table(system.file("extdata", "chr19_regions.bed", package="CSSQ",mustWork = TRUE))
sampleInfo <- read.table(system.file("extdata", "sample_info.txt", package="CSSQ",mustWork = TRUE),sep="\t",header=TRUE)
head(regionBed)
##      V1      V2      V3              V4 V5 V6
## 1 chr19 1237177 1239177 ENSG00000267778  0  -
## 2 chr19 1240748 1242748 ENSG00000099624  0  -
## 3 chr19 1247551 1249551 ENSG00000167470  0  -
## 4 chr19 1258383 1260383 ENSG00000099622  0  -
## 5 chr19 1267164 1269164 ENSG00000267493  0  -
## 6 chr19 1274025 1276025 ENSG00000228300  0  -
sampleInfo
##   Sample.Name Group             IP IP_aligned_reads             IN
## 1     HESC_R1  HESC HESC_IP_R1.bam           282252 HESC_IN_R1.bam
## 2     HESC_R2  HESC HESC_IP_R2.bam           392885 HESC_IN_R2.bam
## 3     HSMM_R1  HSMM HSMM_IP_R1.bam           890043 HSMM_IN_R1.bam
## 4     HSMM_R2  HSMM HSMM_IP_R2.bam           354181 HSMM_IN_R2.bam
##   IN_aligned_reads
## 1           230532
## 2           133898
## 3           201461
## 4           245937
CSSQ provides two options for obtaining raw count data used to perform the analysis. The first option is to ask CSSQ to count the reads and perform background correction. The following commands will perform the steps and return an object with count data and meta data.
countData <- getRegionCounts(system.file("extdata", "chr19_regions.bed", package="CSSQ"),sampleInfo,sampleDir = system.file("extdata", package="CSSQ"))
countData
## class: RangedSummarizedExperiment 
## dim: 15 4 
## metadata(0):
## assays(1): countData
## rownames(15): 1 2 ... 14 15
## rowData names(2): name score
## colnames(4): HESC_R1 HESC_R2 HSMM_R1 HSMM_R2
## colData names(6): Sample.Name Group ... IN IN_aligned_reads
head(assays(countData)$countData)
##     HESC_R1   HESC_R2   HSMM_R1   HSMM_R2
## 1 183.73330 136.07168 300.53868 191.53539
## 2 153.43662 209.88463 699.94899 419.66551
## 3 164.86028 249.60431 451.93156 404.76261
## 4  52.28127  30.87819 -65.09899  12.30791
## 5  88.50546  84.66385  25.06950  83.34102
## 6 158.56927 285.23815 258.11210 328.53040
colData(countData)
## DataFrame with 4 rows and 6 columns
##         Sample.Name       Group                     IP IP_aligned_reads
##         <character> <character>            <character>        <integer>
## HESC_R1     HESC_R1        HESC /tmp/RtmpIIdX01/Rins..           282252
## HESC_R2     HESC_R2        HESC /tmp/RtmpIIdX01/Rins..           392885
## HSMM_R1     HSMM_R1        HSMM /tmp/RtmpIIdX01/Rins..           890043
## HSMM_R2     HSMM_R2        HSMM /tmp/RtmpIIdX01/Rins..           354181
##                             IN IN_aligned_reads
##                    <character>        <integer>
## HESC_R1 /tmp/RtmpIIdX01/Rins..           230532
## HESC_R2 /tmp/RtmpIIdX01/Rins..           133898
## HSMM_R1 /tmp/RtmpIIdX01/Rins..           201461
## HSMM_R2 /tmp/RtmpIIdX01/Rins..           245937
rowRanges(countData)
## GRanges object with 15 ranges and 2 metadata columns:
##      seqnames          ranges strand |            name     score
##         <Rle>       <IRanges>  <Rle> |     <character> <numeric>
##    1    chr19 1237178-1239177      - | ENSG00000267778         0
##    2    chr19 1240749-1242748      - | ENSG00000099624         0
##    3    chr19 1247552-1249551      - | ENSG00000167470         0
##    4    chr19 1258384-1260383      - | ENSG00000099622         0
##    5    chr19 1267165-1269164      - | ENSG00000267493         0
##   ..      ...             ...    ... .             ...       ...
##   11    chr19 1375772-1377771      - | ENSG00000267755         0
##   12    chr19 1382526-1384525      - | ENSG00000115286         0
##   13    chr19 1391169-1393168      - | ENSG00000248015         0
##   14    chr19 1396091-1398090      - | ENSG00000130005         0
##   15    chr19 1406568-1408567      - | ENSG00000071626         0
##   -------
##   seqinfo: 1 sequence from an unspecified genome; no seqlengths
The second option is to provide CSSQ with the count data in a tab separated format. The count data given will directly be used in transformation and normalization steps and no background correction will be performed. 
countData <- loadCountData(system.file("extdata", "sample_count_data.txt", package="CSSQ",mustWork = TRUE),system.file("extdata", "chr19_regions.bed", package="CSSQ"),sampleInfo)
countData
## class: RangedSummarizedExperiment 
## dim: 15 4 
## metadata(0):
## assays(1): countData
## rownames(15): 1 2 ... 14 15
## rowData names(2): name score
## colnames(4): HESC_R1 HESC_R2 HSMM_R1 HSMM_R2
## colData names(6): Sample.Name Group ... IN IN_aligned_reads
head(assays(countData)$countData)
##     HESC_R1   HESC_R2   HSMM_R1   HSMM_R2
## 1 183.73330 136.07168 300.53868 191.53539
## 2 153.43662 209.88463 699.94899 419.66551
## 3 164.86028 249.60431 451.93156 404.76261
## 4  52.28127  30.87819 -65.09899  12.30791
## 5  88.50546  84.66385  25.06950  83.34102
## 6 158.56927 285.23815 258.11210 328.53040
colData(countData)
## DataFrame with 4 rows and 6 columns
##         Sample.Name       Group             IP IP_aligned_reads             IN
##         <character> <character>    <character>        <integer>    <character>
## HESC_R1     HESC_R1        HESC HESC_IP_R1.bam           282252 HESC_IN_R1.bam
## HESC_R2     HESC_R2        HESC HESC_IP_R2.bam           392885 HESC_IN_R2.bam
## HSMM_R1     HSMM_R1        HSMM HSMM_IP_R1.bam           890043 HSMM_IN_R1.bam
## HSMM_R2     HSMM_R2        HSMM HSMM_IP_R2.bam           354181 HSMM_IN_R2.bam
##         IN_aligned_reads
##                <integer>
## HESC_R1           230532
## HESC_R2           133898
## HSMM_R1           201461
## HSMM_R2           245937
rowRanges(countData)
## GRanges object with 15 ranges and 2 metadata columns:
##      seqnames          ranges strand |            name     score
##         <Rle>       <IRanges>  <Rle> |     <character> <numeric>
##    1    chr19 1237178-1239177      - | ENSG00000267778         0
##    2    chr19 1240749-1242748      - | ENSG00000099624         0
##    3    chr19 1247552-1249551      - | ENSG00000167470         0
##    4    chr19 1258384-1260383      - | ENSG00000099622         0
##    5    chr19 1267165-1269164      - | ENSG00000267493         0
##   ..      ...             ...    ... .             ...       ...
##   11    chr19 1375772-1377771      - | ENSG00000267755         0
##   12    chr19 1382526-1384525      - | ENSG00000115286         0
##   13    chr19 1391169-1393168      - | ENSG00000248015         0
##   14    chr19 1396091-1398090      - | ENSG00000130005         0
##   15    chr19 1406568-1408567      - | ENSG00000071626         0
##   -------
##   seqinfo: 1 sequence from an unspecified genome; no seqlengths
Anscombe transformation is then applied to the count data using the ansTransform function. This function also has an option parameter to plot the data distribution of the data before and after transformation. 
ansCountData <- ansTransform(countData)
ansCountData
## class: RangedSummarizedExperiment 
## dim: 12 4 
## metadata(0):
## assays(1): ansCount
## rownames(12): 1 2 ... 12 15
## rowData names(2): name score
## colnames(4): HESC_R1 HESC_R2 HSMM_R1 HSMM_R2
## colData names(6): Sample.Name Group ... IN IN_aligned_reads
head(assays(ansCountData)$ansCount)
##    HESC_R1  HESC_R2   HSMM_R1   HSMM_R2
## 1 27.13730 23.36208 34.693727 27.706345
## 2 24.80416 29.00066 52.927270 40.989780
## 3 25.70877 31.62147 42.535000 40.256061
## 4 14.51293 11.18091  1.224745  7.122613
## 5 18.85529 18.44330 10.088507 18.299292
## 6 25.21462 33.80019 32.155068 36.271499
Anscombe transformed data is then normalized across samples. Normalization in CSSQ using the normalizeData function. It takes as input the number of clusters to use in the underlying k-means algorithm that is used in the normalization process. It is advised to choose the number of clusters by analyzing the data distribution. 
normInfo <- normalizeData(ansCountData,numClusters=4)
normInfo
## class: RangedSummarizedExperiment 
## dim: 12 4 
## metadata(0):
## assays(3): normCount clusterData varData
## rownames(12): 1 2 ... 12 15
## rowData names(2): name score
## colnames(4): HESC_R1 HESC_R2 HSMM_R1 HSMM_R2
## colData names(6): Sample.Name Group ... IN IN_aligned_reads
head(assays(normInfo)$normCount)
##     HESC_R1   HESC_R2    HSMM_R1   HSMM_R2
## 1 0.4589073 0.5021629 0.54439640 0.4733239
## 2 0.4194525 0.6233630 0.83050792 0.7002526
## 3 0.4347500 0.6796967 0.66743768 0.6877181
## 4 0.2454219 0.2403313 0.01921808 0.1216798
## 5 0.3188537 0.3964348 0.15830375 0.3126176
## 6 0.4263936 0.7265277 0.50456105 0.6196474
The normalized data is then used by the DBAnalyze function to perform statistical tests to identify differentially bound regions. CSSQ utilized non-parametric approaches to calculate the test statistics and to calculate the p-value from the test statistics. This is done due to prevalent trend observed in ChIP-seq datasets of not having more than two replicates. The resulting GRanges object from this function contains the Benjamini Hochberg adjusted P-value and a Fold change for each of the input regions. 
result <- DBAnalyze(normInfo,comparison=c("HSMM","HESC"))
result
## GRanges object with 12 ranges and 4 metadata columns:
##      seqnames          ranges strand |            name     score  adj.pval
##         <Rle>       <IRanges>  <Rle> |     <character> <numeric> <numeric>
##    1    chr19 1237178-1239177      - | ENSG00000267778         0  0.958333
##    2    chr19 1240749-1242748      - | ENSG00000099624         0  0.000000
##    3    chr19 1247552-1249551      - | ENSG00000167470         0  0.250000
##    4    chr19 1258384-1260383      - | ENSG00000099622         0  0.250000
##    5    chr19 1267165-1269164      - | ENSG00000267493         0  0.428571
##   ..      ...             ...    ... .             ...       ...       ...
##    8    chr19 1285153-1287152      - | ENSG00000099617         0  0.000000
##   10    chr19 1320224-1322223      - | ENSG00000267372         0  0.833333
##   11    chr19 1375772-1377771      - | ENSG00000267755         0  0.625000
##   12    chr19 1382526-1384525      - | ENSG00000115286         0  0.958333
##   15    chr19 1406568-1408567      - | ENSG00000071626         0  0.250000
##             FC
##      <numeric>
##    1   1.05894
##    2   1.46791
##    3   1.21599
##    4  -3.44755
##    5  -1.51891
##   ..       ...
##    8  -2.86082
##   10  -3.57866
##   11  -4.41708
##   12   1.04604
##   15   1.24902
##   -------
##   seqinfo: 1 sequence from an unspecified genome; no seqlengths
For convenience, most of the above steps are wrapped in preprocessData function to perform them all at one go. All the above steps can be performed using the below commands. 
#To let CSSQ calculate the counts
processedData <- preprocessData(system.file("extdata", "chr19_regions.bed", package="CSSQ"),system.file("extdata", "sample_info.txt", package="CSSQ"),sampleDir = system.file("extdata", package="CSSQ"),numClusters=4,noNeg=TRUE,plotData=FALSE)
#To provide CSSQ with the counts 
processedData <- preprocessData(system.file("extdata", "chr19_regions.bed", package="CSSQ"),system.file("extdata", "sample_info.txt", package="CSSQ"),inputCountData = system.file("extdata", "sample_count_data.txt", package="CSSQ",mustWork = TRUE),numClusters=4,noNeg=TRUE,plotData=FALSE)
#To find differential binding sites
result <- DBAnalyze(processedData,comparison=c("HSMM","HESC"))
processedData
## class: RangedSummarizedExperiment 
## dim: 12 4 
## metadata(0):
## assays(3): normCount clusterData varData
## rownames(12): 1 2 ... 12 15
## rowData names(2): name score
## colnames(4): HESC_R1 HESC_R2 HSMM_R1 HSMM_R2
## colData names(6): Sample.Name Group ... IN IN_aligned_reads
result
## GRanges object with 12 ranges and 4 metadata columns:
##      seqnames          ranges strand |            name     score  adj.pval
##         <Rle>       <IRanges>  <Rle> |     <character> <numeric> <numeric>
##    1    chr19 1237178-1239177      - | ENSG00000267778         0  0.958333
##    2    chr19 1240749-1242748      - | ENSG00000099624         0  0.000000
##    3    chr19 1247552-1249551      - | ENSG00000167470         0  0.250000
##    4    chr19 1258384-1260383      - | ENSG00000099622         0  0.250000
##    5    chr19 1267165-1269164      - | ENSG00000267493         0  0.428571
##   ..      ...             ...    ... .             ...       ...       ...
##    8    chr19 1285153-1287152      - | ENSG00000099617         0  0.000000
##   10    chr19 1320224-1322223      - | ENSG00000267372         0  0.833333
##   11    chr19 1375772-1377771      - | ENSG00000267755         0  0.625000
##   12    chr19 1382526-1384525      - | ENSG00000115286         0  0.958333
##   15    chr19 1406568-1408567      - | ENSG00000071626         0  0.250000
##             FC
##      <numeric>
##    1   1.05894
##    2   1.46791
##    3   1.21599
##    4  -3.44755
##    5  -1.51891
##   ..       ...
##    8  -2.86082
##   10  -3.57866
##   11  -4.41708
##   12   1.04604
##   15   1.24902
##   -------
##   seqinfo: 1 sequence from an unspecified genome; no seqlengths
sessionInfo()
## R version 4.1.0 (2021-05-18)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.2 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.13-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.13-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] parallel  stats4    stats     graphics  grDevices utils     datasets 
## [8] methods   base     
## 
## other attached packages:
##  [1] CSSQ_1.4.1                  rtracklayer_1.52.0         
##  [3] SummarizedExperiment_1.22.0 Biobase_2.52.0             
##  [5] GenomicRanges_1.44.0        GenomeInfoDb_1.28.1        
##  [7] IRanges_2.26.0              S4Vectors_0.30.0           
##  [9] BiocGenerics_0.38.0         MatrixGenerics_1.4.0       
## [11] matrixStats_0.60.0          knitr_1.33                 
## [13] BiocStyle_2.20.2           
## 
## loaded via a namespace (and not attached):
##  [1] httr_1.4.2               bit64_4.0.5              assertthat_0.2.1        
##  [4] BiocManager_1.30.16      BiocFileCache_2.0.0      blob_1.2.2              
##  [7] GenomeInfoDbData_1.2.6   Rsamtools_2.8.0          yaml_2.2.1              
## [10] progress_1.2.2           pillar_1.6.2             RSQLite_2.2.7           
## [13] lattice_0.20-44          glue_1.4.2               digest_0.6.27           
## [16] XVector_0.32.0           colorspace_2.0-2         htmltools_0.5.1.1       
## [19] Matrix_1.3-4             XML_3.99-0.6             pkgconfig_2.0.3         
## [22] biomaRt_2.48.2           zlibbioc_1.38.0          purrr_0.3.4             
## [25] scales_1.1.1             BiocParallel_1.26.1      tibble_3.1.3            
## [28] KEGGREST_1.32.0          ggplot2_3.3.5            generics_0.1.0          
## [31] ellipsis_0.3.2           cachem_1.0.5             GenomicFeatures_1.44.0  
## [34] magrittr_2.0.1           crayon_1.4.1             memoise_2.0.0           
## [37] evaluate_0.14            fansi_0.5.0              xml2_1.3.2              
## [40] tools_4.1.0              prettyunits_1.1.1        hms_1.1.0               
## [43] BiocIO_1.2.0             lifecycle_1.0.0          stringr_1.4.0           
## [46] munsell_0.5.0            DelayedArray_0.18.0      AnnotationDbi_1.54.1    
## [49] Biostrings_2.60.1        compiler_4.1.0           rlang_0.4.11            
## [52] grid_4.1.0               RCurl_1.98-1.3           rappdirs_0.3.3          
## [55] rjson_0.2.20             bitops_1.0-7             rmarkdown_2.9           
## [58] codetools_0.2-18         gtable_0.3.0             restfulr_0.0.13         
## [61] DBI_1.1.1                curl_4.3.2               R6_2.5.0                
## [64] GenomicAlignments_1.28.0 dplyr_1.0.7              fastmap_1.1.0           
## [67] bit_4.0.4                utf8_1.2.2               filelock_1.0.2          
## [70] stringi_1.7.3            Rcpp_1.0.7               vctrs_0.3.8             
## [73] png_0.1-7                dbplyr_2.1.1             tidyselect_1.1.1        
## [76] xfun_0.24