There are four testing scenarios depending on the type format of the query set and database sets. They are shown with the respective testing scenario in the table below. testEnrichment, testEnrichmentSEA are for Fisher’s exact test and Set Enrichment Analysis respectively.
| Continuous Database Set | Discrete Database Set | |
|---|---|---|
| Continuous Query | Correlation-based | Set Enrichment Analysis | 
| Discrete Query | Set Enrichment Analysis | Fisher’s Exact Test | 
The query may be a named continuous vector. In that case, either a gene enrichment score will be calculated (if the database is discrete) or a Spearman correlation will be calculated (if the database is continuous as well). The three other cases are shown below using biologically relevant examples.
To display this functionality, let’s load two numeric database sets individually. One is a database set for CpG density and the other is a database set corresponding to the distance of the nearest transcriptional start site (TSS) to each probe.
sesameDataCache(data_titles = c("KYCG.MM285.seqContextN.20210630"))
res <- testEnrichmentSEA(query, "MM285.seqContextN")
main_stats <- c("dbname", "test", "estimate", "FDR", "nQ", "nD", "overlap")
res[,main_stats]The estimate here is enrichment score.
NOTE: Negative enrichment score suggests enrichment of the categorical database with the higher values (in the numerical database). Positive enrichment score represent enrichment with the smaller values. As expected, the designed TSS CpGs are significantly enriched in smaller TSS distance and higher CpG density.
Alternatively one can test the enrichment of a continuous query with discrete databases. Here we will use the methylation level from a sample as the query and test it against the chromHMM chromatin states.
library(sesame)
sesameDataCache(data_titles = c("MM285.1.SigDF"))
beta_values <- getBetas(sesameDataGet("MM285.1.SigDF"))
res <- testEnrichmentSEA(beta_values, "MM285.chromHMM")
main_stats <- c("dbname", "test", "estimate", "FDR", "nQ", "nD", "overlap")
res[,main_stats] As expected, chromatin states Tss, Enh has negative enrichment score, meaning these databases are associated with small values of the query (DNA methylation level). On the contrary, Het and Quies states are associated with high methylation level.
## R version 4.5.1 Patched (2025-08-23 r88802)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 24.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.22-bioc/R/lib/libRblas.so 
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.12.0  LAPACK version 3.12.0
## 
## 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       
## 
## time zone: America/New_York
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] sesame_1.27.1               knitr_1.50                 
##  [3] gprofiler2_0.2.3            SummarizedExperiment_1.39.2
##  [5] Biobase_2.69.1              GenomicRanges_1.61.5       
##  [7] Seqinfo_0.99.2              IRanges_2.43.5             
##  [9] S4Vectors_0.47.4            MatrixGenerics_1.21.0      
## [11] matrixStats_1.5.0           sesameData_1.27.1          
## [13] ExperimentHub_2.99.5        AnnotationHub_3.99.6       
## [15] BiocFileCache_2.99.6        dbplyr_2.5.1               
## [17] BiocGenerics_0.55.1         generics_0.1.4             
## [19] knowYourCG_1.5.2           
## 
## loaded via a namespace (and not attached):
##  [1] tidyselect_1.2.1      viridisLite_0.4.2     dplyr_1.1.4          
##  [4] farver_2.1.2          blob_1.2.4            bitops_1.0-9         
##  [7] filelock_1.0.3        Biostrings_2.77.2     S7_0.2.0             
## [10] RCurl_1.98-1.17       lazyeval_0.2.2        fastmap_1.2.0        
## [13] digest_0.6.37         lifecycle_1.0.4       KEGGREST_1.49.1      
## [16] RSQLite_2.4.3         magrittr_2.0.4        compiler_4.5.1       
## [19] rlang_1.1.6           sass_0.4.10           tools_4.5.1          
## [22] yaml_2.3.10           data.table_1.17.8     htmlwidgets_1.6.4    
## [25] S4Arrays_1.9.1        bit_4.6.0             curl_7.0.0           
## [28] DelayedArray_0.35.3   plyr_1.8.9            RColorBrewer_1.1-3   
## [31] BiocParallel_1.43.4   abind_1.4-8           withr_3.0.2          
## [34] purrr_1.1.0           grid_4.5.1            preprocessCore_1.71.2
## [37] wheatmap_0.2.0        colorspace_2.1-2      ggplot2_4.0.0        
## [40] scales_1.4.0          dichromat_2.0-0.1     cli_3.6.5            
## [43] rmarkdown_2.30        crayon_1.5.3          httr_1.4.7           
## [46] reshape2_1.4.4        tzdb_0.5.0            DBI_1.2.3            
## [49] cachem_1.1.0          stringr_1.5.2         parallel_4.5.1       
## [52] AnnotationDbi_1.71.1  BiocManager_1.30.26   XVector_0.49.1       
## [55] vctrs_0.6.5           Matrix_1.7-4          jsonlite_2.0.0       
## [58] hms_1.1.3             bit64_4.6.0-1         ggrepel_0.9.6        
## [61] fontawesome_0.5.3     plotly_4.11.0         tidyr_1.3.1          
## [64] jquerylib_0.1.4       glue_1.8.0            codetools_0.2-20     
## [67] stringi_1.8.7         gtable_0.3.6          BiocVersion_3.22.0   
## [70] tibble_3.3.0          pillar_1.11.1         rappdirs_0.3.3       
## [73] htmltools_0.5.8.1     R6_2.6.1              httr2_1.2.1          
## [76] evaluate_1.0.5        lattice_0.22-7        readr_2.1.5          
## [79] png_0.1-8             memoise_2.0.1         bslib_0.9.0          
## [82] Rcpp_1.1.0            SparseArray_1.9.1     xfun_0.53            
## [85] pkgconfig_2.0.3