This package implements the GENIE3 algorithm for inferring gene regulatory networks from expression data. https://bioconductor.org/packages/release/bioc/vignettes/GENIE3/inst/doc/GENIE3.html#obtain-more-information-1
1.GENIE3 {GENIE3}.GENIE3 Infers a gene regulatory network (in the form of a weighted adjacency matrix) from expression data, using ensembles of regression trees.
library(GENIE3)
## Generate fake expression matrix
exprMatrix <- matrix(sample(1:10, 100, replace=TRUE), nrow=20)
rownames(exprMatrix) <- paste("Gene", 1:20, sep="")
colnames(exprMatrix) <- paste("Sample", 1:5, sep="")
## Run GENIE3
set.seed(123) # For reproducibility of results
weightMatrix <- GENIE3(exprMatrix, regulators=paste("Gene", 1:5, sep=""))
## Get ranking of edges
linkList <- getLinkList(weightMatrix)
head(linkList)
## regulatoryGene targetGene weight
## 1 Gene4 Gene1 0.6256487
## 2 Gene3 Gene2 0.5983628
## 3 Gene3 Gene4 0.5297676
## 4 Gene2 Gene17 0.5031615
## 5 Gene5 Gene8 0.4877041
## 6 Gene3 Gene10 0.4403217
## Different regulators for each gene & return as list
regulatorsList <- list("Gene1"=rownames(exprMatrix)[1:10],
"Gene2"=rownames(exprMatrix)[10:20],
"Gene20"=rownames(exprMatrix)[15:20])
set.seed(123)
weightList <- GENIE3(exprMatrix, nCores=1, targets=names(regulatorsList), regulators=regulatorsList, returnMatrix=FALSE)
2.getLinkList {GENIE3}.getLinkList Converts the weight matrix, as returned by GENIE3, to a sorted list of regulatory links (most likely links first).
## Generate fake expression matrix
exprMat <- matrix(sample(1:10, 100, replace=TRUE), nrow=20)
rownames(exprMat) <- paste("Gene", 1:20, sep="")
colnames(exprMat) <- paste("Sample", 1:5, sep="")
## Run GENIE3
weightMat <- GENIE3(exprMat, regulators=paste("Gene", 1:5, sep=""))
## Get ranking of edges
linkList <- getLinkList(weightMat)
head(linkList)
## regulatoryGene targetGene weight
## 1 Gene1 Gene8 0.5723736
## 2 Gene2 Gene4 0.5013760
## 3 Gene5 Gene13 0.4994663
## 4 Gene4 Gene17 0.4895139
## 5 Gene2 Gene5 0.4552329
## 6 Gene4 Gene20 0.4476125
This package is deprecated. It will probably be removed from Bioconductor.
This package provides a comprehensive collection of various microarray-based classification algorithms both from Machine Learning and Statistics. Variable Selection, Hyperparameter tuning, Evaluation and Comparison can be performed combined or stepwise in a user-friendly environment. https://bioconductor.org/packages/release/bioc/vignettes/CMA/inst/doc/CMA_vignette.pdf
Pigengene package provides an efficient way to infer biological signatures from gene expression profiles. The signatures are independent from the underlying platform, e.g., the input can be microarray or RNA Seq data. It can even infer the signatures using data from one platform, and evaluate them on the other. Pigengene identifies the modules (clusters) of highly coexpressed genes using coexpression network analysis, summarizes the biological information of each module in an eigengene, learns a Bayesian network that models the probabilistic dependencies between modules, and builds a decision tree based on the expression of eigengenes. https://bioconductor.org/packages/release/bioc/vignettes/Pigengene/inst/doc/Pigengene_inference.pdf
A reproducible and easy-to-use toolkit for visualization, pre-processing, exploration, and statistical analysis of omics datasets. The main aim of POMA is to enable a flexible data cleaning and statistical analysis processes in one comprehensible and user-friendly R package. This package has a Shiny app version called POMAShiny that implements all POMA functions. See https://github.com/pcastellanoescuder/POMAShiny. See Castellano-Escuder P, González-Domínguez R, Carmona-Pontaque F, et al. (2021) for more details. https://bioconductor.org/packages/release/bioc/vignettes/POMA/inst/doc/POMA-eda.html https://bioconductor.org/packages/release/bioc/vignettes/POMA/inst/doc/POMA-demo.html
This packages provides a flexible, fast and accurate method for targeted pre-processing of GC-MS data. The user provides a (often very large) set of GC chromatograms and a metabolite library of targets. The package will automatically search those targets in the chromatograms resulting in a data matrix that can be used for further data analysis. https://bioconductor.org/packages/release/bioc/vignettes/TargetSearch/inst/doc/TargetSearch.pdf
DEGraph implements recent hypothesis testing methods which directly assess whether a particular gene network is differentially expressed between two conditions. This is to be contrasted with the more classical two-step approaches which first test individual genes, then test gene sets for enrichment in differentially expressed genes. These recent methods take into account the topology of the network to yield more powerful detection procedures. DEGraph provides methods to easily test all KEGG pathways for differential expression on any gene expression data set and tools to visualize the results. https://bioconductor.org/packages/release/bioc/vignettes/DEGraph/inst/doc/DEGraph.pdf
mistyR is an implementation of the Multiview Intercellular SpaTialmodeling framework (MISTy). MISTy is an explainable machine learning framework for knowledge extraction and analysis of single-cell, highly multiplexed, spatially resolved data. MISTy facilitates an in-depth understanding of marker interactions by profiling the intra- and intercellular relationships. MISTy is a flexible framework able to process a custom number of views. Each of these views can describe a different spatial context, i.e., define a relationship among the observed expressions of the markers, such as intracellular regulation or paracrine regulation, but also, the views can also capture cell-type specific relationships, capture relations between functional footprints or focus on relations between different anatomical regions. Each MISTy view is considered as a potential source of variability in the measured marker expressions. Each MISTy view is then analyzed for its contribution to the total expression of each marker and is explained in terms of the interactions with other measurements that led to the observed contribution. https://bioconductor.org/packages/release/bioc/vignettes/mistyR/inst/doc/mistyR.html
Offers a set of ‘autoplot’ methods to visualize tree-like structures (e.g., hierarchical clustering and classification/regression trees) using ‘ggtree’. You can adjust graphical parameters using grammar of graphic syntax and integrate external data to the tree. https://bioconductor.org/packages/release/bioc/vignettes/ggtreeDendro/inst/doc/ggtreeDendro.html