Introduction

COmplex Network Description Of Regulators (CONDOR) implements methods for clustering bipartite networks and estimating the contribution of each node to its community’s modularity. For an application of this method to identify diesease-associated single nucleotide polymorphisms, see (https://journals.plos.org/ploscompbiol/article?id=10.1371/journal.pcbi.1005033).

Installation

CONDOR can be installed through netZooR as follows:

if(!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")
BiocManager::install("netZooR")

Implementing the Bipartite Modularity Maximization

The code in condorModularityMax is an implementation of the method described in Michael Barber’s paper Modularity and community detection in bipartite networks (Phys. Rev. E 76, 066102 (2007)). A few general comments:

Workflow

library(netZooR)

condor works with an edgelist (elist in the code below) as its input.

r = c(1,1,1,2,2,2,3,3,3,4,4);
b = c(1,2,3,1,2,4,2,3,4,3,4);
reds <- c("Alice","Sue","Janine","Mary")
blues <- c("Bob","John","Ed","Hank")
elist <- data.frame(red=reds[r], blue=blues[b])

In elist, notice all nodes of the same type–women and men in this case–appear in the same column together. This is a requirement. createCondorObject will throw an error if a node appears in both columns.

condor.object <- createCondorObject(elist)

A condor.object is just a list. You can look at the different items using names

names(condor.object)
## [1] "G"          "edges"      "Qcoms"      "modularity" "red.memb"  
## [6] "blue.memb"  "qscores"

condorCluster will cluster the nodes and produce the overall modularity along with two community membership data.frames:

condor.object <- condorCluster(condor.object)
## [1] "modularity of projected graph 0"
## [1] "Q = 0"
## [1] "Q = 0.198347107438017"
## [1] "Q = 0.231404958677686"
## [1] "Q = 0.231404958677686"
print(condor.object$red.memb)
##   red.names com
## 1     Alice   1
## 2    Janine   2
## 3      Mary   2
## 4       Sue   1
print(condor.object$blue.memb)
##   blue.names com
## 1        Bob   1
## 2         Ed   2
## 3       Hank   2
## 4       John   1

Nodes in first community are {Alice, John, Bob, Sue}, nodes in second community are {Ed, Janine, Hank, Mary} based on the modularity maximization. Here’s a picture:

gtoy = graph.edgelist(as.matrix(elist),directed=FALSE)
set.graph.attribute(gtoy, "layout", layout.kamada.kawai(gtoy))
## IGRAPH 4b6979c UN-- 8 11 -- 
## + attr: layout (g/n), name (v/c)
## + edges from 4b6979c (vertex names):
##  [1] Alice--Bob    Alice--John   Alice--Ed     Bob  --Sue    John --Sue   
##  [6] Sue  --Hank   John --Janine Ed   --Janine Hank --Janine Ed   --Mary  
## [11] Hank --Mary
V(gtoy)[c(reds,blues)]$color <- c(rep("red",4),rep("blue",4))
plot(gtoy,vertex.label.dist=2)

To get each node’s modularity contribution (as a fraction of the community’s modularity), run

condor.object <- condorQscore(condor.object)

If you have a subset of nodes that you think are more likely to lie at the cores of your communities, you can test this using condorCoreEnrich:

q_women <- condor.object$qscores$red.qscore
core_stats <- condorCoreEnrich(test_nodes=c("Alice","Mary"),
                                 q=q_women,perm=TRUE,plot.hist=TRUE)

condor also works on weighted bipartite networks. The package comes with a quantitative pollination network data set (Small 1976) taken from the NCEAS interaction webs data base, containing interactions between 13 plants and 34 pollinators.

data(small1976)
condor.object <- createCondorObject(small1976)
condor.object <- condorCluster(condor.object, project=FALSE)
## [1] "modularity of projected graph 0.525346928655047"
## [1] "Q = 0.52666696475026"
## [1] "Q = 0.52666696475026"
condorPlotHeatmap(condor.object)

Session Information

sessionInfo()
## R version 4.3.1 (2023-06-16)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.18-bioc/R/lib/libRblas.so 
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.10.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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] netZooR_1.6.0       matrixcalc_1.0-6    yarn_1.28.0        
## [4] pandaR_1.34.0       Biobase_2.62.0      BiocGenerics_0.48.0
## [7] reticulate_1.34.0   igraph_1.5.1       
## 
## loaded via a namespace (and not attached):
##   [1] STRINGdb_2.14.0             fs_1.6.3                   
##   [3] matrixStats_1.0.0           bitops_1.0-7               
##   [5] httr_1.4.7                  RColorBrewer_1.1-3         
##   [7] doParallel_1.0.17           Rgraphviz_2.46.0           
##   [9] repr_1.1.6                  tools_4.3.1                
##  [11] doRNG_1.8.6                 backports_1.4.1            
##  [13] utf8_1.2.4                  R6_2.5.1                   
##  [15] vegan_2.6-4                 HDF5Array_1.30.0           
##  [17] mgcv_1.9-0                  rhdf5filters_1.14.0        
##  [19] permute_0.9-7               uchardet_1.1.1             
##  [21] prettyunits_1.2.0           base64_2.0.1               
##  [23] preprocessCore_1.64.0       cli_3.6.1                  
##  [25] penalized_0.9-52            sass_0.4.7                 
##  [27] readr_2.1.4                 genefilter_1.84.0          
##  [29] askpass_1.2.0               Rsamtools_2.18.0           
##  [31] pbdZMQ_0.3-10               siggenes_1.76.0            
##  [33] illuminaio_0.44.0           AnnotationForge_1.44.0     
##  [35] scrime_1.3.5                plotrix_3.8-2              
##  [37] limma_3.58.0                RSQLite_2.3.1              
##  [39] generics_0.1.3              GOstats_2.68.0             
##  [41] quantro_1.36.0              BiocIO_1.12.0              
##  [43] gtools_3.9.4                dplyr_1.1.3                
##  [45] GO.db_3.18.0                Matrix_1.6-1.1             
##  [47] fansi_1.0.5                 S4Vectors_0.40.0           
##  [49] abind_1.4-5                 lifecycle_1.0.3            
##  [51] yaml_2.3.7                  edgeR_4.0.0                
##  [53] SummarizedExperiment_1.32.0 gplots_3.1.3               
##  [55] rhdf5_2.46.0                SparseArray_1.2.0          
##  [57] BiocFileCache_2.10.0        grid_4.3.1                 
##  [59] blob_1.2.4                  crayon_1.5.2               
##  [61] lattice_0.22-5              GenomicFeatures_1.54.0     
##  [63] annotate_1.80.0             KEGGREST_1.42.0            
##  [65] pillar_1.9.0                knitr_1.44                 
##  [67] beanplot_1.3.1              GenomicRanges_1.54.0       
##  [69] rjson_0.2.21                codetools_0.2-19           
##  [71] glue_1.6.2                  downloader_0.4             
##  [73] data.table_1.14.8           vctrs_0.6.4                
##  [75] png_0.1-8                   gtable_0.3.4               
##  [77] assertthat_0.2.1            gsubfn_0.7                 
##  [79] cachem_1.0.8                xfun_0.40                  
##  [81] S4Arrays_1.2.0              survival_3.5-7             
##  [83] iterators_1.0.14            statmod_1.5.0              
##  [85] nlme_3.1-163                Category_2.68.0            
##  [87] bit64_4.0.5                 progress_1.2.2             
##  [89] filelock_1.0.2              GenomeInfoDb_1.38.0        
##  [91] bslib_0.5.1                 nor1mix_1.3-0              
##  [93] KernSmooth_2.23-22          colorspace_2.1-0           
##  [95] DBI_1.1.3                   nnet_7.3-19                
##  [97] tidyselect_1.2.0            bit_4.0.5                  
##  [99] compiler_4.3.1              curl_5.1.0                 
## [101] chron_2.3-61                graph_1.80.0               
## [103] xml2_1.3.5                  ggdendro_0.1.23            
## [105] DelayedArray_0.28.0         rtracklayer_1.62.0         
## [107] scales_1.2.1                caTools_1.18.2             
## [109] hexbin_1.28.3               quadprog_1.5-8             
## [111] RBGL_1.78.0                 rappdirs_0.3.3             
## [113] stringr_1.5.0               digest_0.6.33              
## [115] rmarkdown_2.25              GEOquery_2.70.0            
## [117] XVector_0.42.0              htmltools_0.5.6.1          
## [119] pkgconfig_2.0.3             base64enc_0.1-3            
## [121] sparseMatrixStats_1.14.0    MatrixGenerics_1.14.0      
## [123] dbplyr_2.3.4                fastmap_1.1.1              
## [125] rlang_1.1.1                 DelayedMatrixStats_1.24.0  
## [127] jquerylib_0.1.4             jsonlite_1.8.7             
## [129] BiocParallel_1.36.0         mclust_6.0.0               
## [131] RCurl_1.98-1.12             magrittr_2.0.3             
## [133] GenomeInfoDbData_1.2.11     Rhdf5lib_1.24.0            
## [135] IRkernel_1.3.2              munsell_0.5.0              
## [137] Rcpp_1.0.11                 proto_1.0.0                
## [139] sqldf_0.4-11                stringi_1.7.12             
## [141] RJSONIO_1.3-1.8             zlibbioc_1.48.0            
## [143] MASS_7.3-60                 plyr_1.8.9                 
## [145] bumphunter_1.44.0           org.Hs.eg.db_3.18.0        
## [147] minfi_1.48.0                parallel_4.3.1             
## [149] Biostrings_2.70.0           IRdisplay_1.1              
## [151] splines_4.3.1               multtest_2.58.0            
## [153] hash_2.2.6.3                hms_1.1.3                  
## [155] locfit_1.5-9.8              uuid_1.1-1                 
## [157] RUnit_0.4.32                base64url_1.4              
## [159] rngtools_1.5.2              reshape2_1.4.4             
## [161] biomaRt_2.58.0              stats4_4.3.1               
## [163] XML_3.99-0.14               evaluate_0.22              
## [165] tzdb_0.4.0                  foreach_1.5.2              
## [167] tidyr_1.3.0                 openssl_2.1.1              
## [169] purrr_1.0.2                 reshape_0.8.9              
## [171] ggplot2_3.4.4               xtable_1.8-4               
## [173] restfulr_0.0.15             viridisLite_0.4.2          
## [175] RCy3_2.22.0                 tibble_3.2.1               
## [177] memoise_2.0.1               AnnotationDbi_1.64.0       
## [179] GenomicAlignments_1.38.0    IRanges_2.36.0             
## [181] cluster_2.1.4               GSEABase_1.64.0