In this document, a typical analysis using the groupProbPlot function is shown. The indention with this function is to display differences between groups, tissues, stimulations or similar, with a single-cell resolution. The idea is that a cell that comes from a cell type that is specific for one of the two investigated groups will be surrounded exclusively by euclidean nearest neighbors that come from the same group. This is the basis for the analysis: in the standard case, the individual cell is given a number between -1 and 1 that reflects which fraction of the 100 closest neighbors in the euclidean space created by all the input markers that come from one group (-1) or the other (1). The scale is tweaked to reflect that the middle in this case corresponds to a likelihood of a perfect mix with 50% of the cells from each group. For an introduction to the package and example data description, see the general DepecheR package vinjette.
This is how to install the package, if that has not already been done:
if(!requireNamespace("BiocManager", quietly = TRUE))
    install.packages("BiocManager")
BiocManager::install("DepecheR")For visualization purposes, some 2-dimensional representation of the data is necessary. This could just be two of the variables used to construct the probability vector, but it is more informative to include data on all variables, aided by e.g. tSNE or UMAP. In this case, we will display the data with tSNE.
library(DepecheR)
data("testData")
data("testDataSNE")This function differs from the other group differentiation functions in the DepecheR package in that no clustering output from the depeche function or any other clustering algorithm is needed as input. Instead, all the indata that the euclidean nearest neighbors should be identified from needs to be added, together with a group identity vector and the 2D data used to display the data. Optionally, the resulting group probability vector can be returned, which will be the case in this example.
dataTrans <-
  testData[, c("SYK", "CD16", "CD57", "EAT.2", "CD8", "NKG2C", "CD2", "CD56")]
testData$groupProb <- groupProbPlot(xYData = testDataSNE$Y, 
                                    groupVector = testData$label, 
                                    groupName1 = "Group_1",
                                    groupName2 = "Group_2",
                                    dataTrans = dataTrans)
## [1] "Done with k-means"
## [1] "Now the first bit is done, and the iterative part takes off"
## [1] "Clusters 1 to 7 smoothed in 2.9159369468689 . Now, 13 clusters are 
## [1] left."
## [1] "Clusters 8 to 14 smoothed in 0.925199031829834 . Now, 6 clusters are 
## [1] left."
## [1] "Clusters 15 to 20 smoothed in 0.905373096466064 . Now, 0 clusters are 
## [1] left."When running this function, the output is a high-resolution plot saved to disc. A low resolution variant of the result (made small for BioConductor size constraint reasons) is shown here. In this case, the groups are so separated, that almost all cells show a 100% probability of belonging to one of the groups or the other. This is unusual with real data, so the white fields are generally larger.
Group probaility plot
sessionInfo()## R version 4.0.3 (2020-10-10)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.5 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.12-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.12-bioc/R/lib/libRlapack.so
## 
## locale:
##  [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
##  [3] LC_TIME=en_US.UTF-8        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] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] DepecheR_1.6.0   knitr_1.30       BiocStyle_2.18.0
## 
## loaded via a namespace (and not attached):
##  [1] ggrepel_0.8.2       Rcpp_1.0.5          lattice_0.20-41    
##  [4] tidyr_1.1.2         FNN_1.1.3           corpcor_1.6.9      
##  [7] snow_0.4-3          gtools_3.8.2        digest_0.6.27      
## [10] foreach_1.5.1       RSpectra_0.16-0     R6_2.4.1           
## [13] plyr_1.8.6          ellipse_0.4.2       evaluate_0.14      
## [16] ggplot2_3.3.2       pillar_1.4.6        gplots_3.1.0       
## [19] rlang_0.4.8         gdata_2.18.0        gmodels_2.18.1     
## [22] Matrix_1.2-18       rmarkdown_2.5       rARPACK_0.11-0     
## [25] moments_0.14        stringr_1.4.0       igraph_1.2.6       
## [28] munsell_0.5.0       compiler_4.0.3      xfun_0.18          
## [31] pkgconfig_2.0.3     htmltools_0.5.0     doSNOW_1.0.19      
## [34] tidyselect_1.1.0    tibble_3.0.4        gridExtra_2.3      
## [37] bookdown_0.21       codetools_0.2-16    matrixStats_0.57.0 
## [40] viridisLite_0.3.0   crayon_1.3.4        dplyr_1.0.2        
## [43] MASS_7.3-53         bitops_1.0-6        grid_4.0.3         
## [46] gtable_0.3.0        lifecycle_0.2.0     magrittr_1.5       
## [49] scales_1.1.1        KernSmooth_2.23-17  stringi_1.5.3      
## [52] reshape2_1.4.4      viridis_0.5.1       robustbase_0.93-6  
## [55] ellipsis_0.3.1      generics_0.0.2      vctrs_0.3.4        
## [58] RColorBrewer_1.1-2  iterators_1.0.13    mixOmics_6.14.0    
## [61] tools_4.0.3         glue_1.4.2          DEoptimR_1.0-8     
## [64] purrr_0.3.4         parallel_4.0.3      yaml_2.2.1         
## [67] colorspace_1.4-1    BiocManager_1.30.10 caTools_1.18.0     
## [70] beanplot_1.2