## ----installation, eval=FALSE------------------------------------------------- # if (!requireNamespace("BiocManager", quietly = TRUE)) # install.packages("BiocManager") # # BiocManager::install("RandomWalkRestartMH") ## ----installation_2, eval=FALSE----------------------------------------------- # devtools::install_github("alberto-valdeolivas/RandomWalkRestartMH") ## ----Monoplex 1--------------------------------------------------------------- library(RandomWalkRestartMH) library(igraph) data(PPI_Network) # We load the PPI_Network ## We create a Multiplex object composed of 1 layer (It's a Monoplex Network) ## and we display how it looks like PPI_MultiplexObject <- create.multiplex(list(PPI=PPI_Network)) PPI_MultiplexObject ## ----Monoplex 2--------------------------------------------------------------- AdjMatrix_PPI <- compute.adjacency.matrix(PPI_MultiplexObject) AdjMatrixNorm_PPI <- normalize.multiplex.adjacency(AdjMatrix_PPI) ## ----Monoplex 3--------------------------------------------------------------- SeedGene <- c("PIK3R1") ## We launch the algorithm with the default parameters (See details on manual) RWR_PPI_Results <- Random.Walk.Restart.Multiplex(AdjMatrixNorm_PPI, PPI_MultiplexObject,SeedGene) # We display the results RWR_PPI_Results ## ----Monoplex 4--------------------------------------------------------------- ## In this case we selected to induce a network with the Top 15 genes. TopResults_PPI <- create.multiplexNetwork.topResults(RWR_PPI_Results,PPI_MultiplexObject, k=15) ## ----Figure1, fig.width=10, fig.height=5, dpi=300, echo = TRUE, fig.cap="Figure 1: RWR on a monoplex PPI Network. Network representation of the top 15 ranked genes when the RWR algorithm is executed using the PIK3R1 gene as seed (yellow node). Blue edges represent PPI interactions."---- ## We print that cluster with its interactions. par(mar=c(0.1,0.1,0.1,0.1)) plot(TopResults_PPI, vertex.label.color="black",vertex.frame.color="#ffffff", vertex.size= 20, edge.curved=.2, vertex.color = ifelse(igraph::V(TopResults_PPI)$name == "PIK3R1","yellow", "#00CCFF"), edge.color="blue",edge.width=0.8) ## ----heterogeneous 1---------------------------------------------------------- data(Disease_Network) # We load our disease Network ## We create a multiplex object for the monoplex disease Network Disease_MultiplexObject <- create.multiplex(list(Disease=Disease_Network)) ## We load a data frame containing the gene-disease associations. ## See ?create.multiplexHet for details about its format data(GeneDiseaseRelations) ## We keep gene-diseases associations where genes are present in the PPI ## network GeneDiseaseRelations_PPI <- GeneDiseaseRelations[which(GeneDiseaseRelations$hgnc_symbol %in% PPI_MultiplexObject$Pool_of_Nodes),] ## We create the MultiplexHet object. PPI_Disease_Net <- create.multiplexHet(PPI_MultiplexObject, Disease_MultiplexObject, GeneDiseaseRelations_PPI) ## The results look like that PPI_Disease_Net ## ----heterogeneous 2---------------------------------------------------------- PPIHetTranMatrix <- compute.transition.matrix(PPI_Disease_Net) ## ----heterogeneous 3---------------------------------------------------------- SeedDisease <- c("269880") ## We launch the algorithm with the default parameters (See details on manual) RWRH_PPI_Disease_Results <- Random.Walk.Restart.MultiplexHet(PPIHetTranMatrix, PPI_Disease_Net,SeedGene,SeedDisease) # We display the results RWRH_PPI_Disease_Results ## ----heterogeneous 4---------------------------------------------------------- ## In this case we select to induce a network with the Top 10 genes ## and the Top 10 diseases. TopResults_PPI_Disease <- create.multiplexHetNetwork.topResults(RWRH_PPI_Disease_Results, PPI_Disease_Net, GeneDiseaseRelations_PPI, k=10) ## ----Figure2, fig.width=10, fig.height=5, dpi=300, echo = TRUE, fig.cap="Figure 2: RWR-H on a heterogeneous PPI-Disease Network. Network representation of the top 10 ranked genes and the top 10 ranked diseases when the RWR-H algorithm is executed using the PIK3R1 gene and the SHORT syndrome disease (MIM code: 269880) as seeds (yellow nodes). Circular nodes represent genes and rectangular nodes show diseases. Blue edges are PPI interactions and black edges are similarity links between diseases. Dashed edges are the bipartite gene-disease associations."---- ## We print that cluster with its interactions. par(mar=c(0.1,0.1,0.1,0.1)) plot(TopResults_PPI_Disease, vertex.label.color="black", vertex.frame.color="#ffffff", vertex.size= 20, edge.curved=.2, vertex.color = ifelse(V(TopResults_PPI_Disease)$name == "PIK3R1" | V(TopResults_PPI_Disease)$name == "269880","yellow", ifelse(V(TopResults_PPI_Disease)$name %in% PPI_Disease_Net$Multiplex1$Pool_of_Nodes,"#00CCFF","Grey75")), edge.color=ifelse(E(TopResults_PPI_Disease)$type == "PPI","blue", ifelse(E(TopResults_PPI_Disease)$type == "Disease","black","grey50")), edge.width=0.8, edge.lty=ifelse(E(TopResults_PPI_Disease)$type == "bipartiteRelations", 2,1), vertex.shape= ifelse(V(TopResults_PPI_Disease)$name %in% PPI_Disease_Net$Multiplex1$Pool_of_Nodes,"circle","rectangle")) ## ----Multiplex1--------------------------------------------------------------- data(Pathway_Network) # We load the Pathway Network ## We create a 2-layers Multiplex object PPI_PATH_Multiplex <- create.multiplex(list(PPI=PPI_Network,PATH=Pathway_Network)) PPI_PATH_Multiplex ## ----Multiplex2--------------------------------------------------------------- AdjMatrix_PPI_PATH <- compute.adjacency.matrix(PPI_PATH_Multiplex) AdjMatrixNorm_PPI_PATH <- normalize.multiplex.adjacency(AdjMatrix_PPI_PATH) ## ----Multiplex3--------------------------------------------------------------- ## We launch the algorithm with the default parameters (See details on manual) RWR_PPI_PATH_Results <- Random.Walk.Restart.Multiplex(AdjMatrixNorm_PPI_PATH, PPI_PATH_Multiplex,SeedGene) # We display the results RWR_PPI_PATH_Results ## ----Multiplex4--------------------------------------------------------------- ## In this case we select to induce a multiplex network with the Top 15 genes. TopResults_PPI_PATH <- create.multiplexNetwork.topResults(RWR_PPI_PATH_Results, PPI_PATH_Multiplex, k=15) ## ----Figure 3, fig.width=10, fig.height=5, dpi=300, echo = TRUE, fig.cap="Figure 3: RWR-M on a multiplex PPI-Pathway Network. Network representation of the top 15 ranked genes when the RWR-M algorithm is executed using the *PIK3R1* gene (yellownode). Blue curved edges are PPI interactions and red straight edges are Pathways links. All the interactions are aggregated into a monoplex network only for visualization purposes."---- ## We print that cluster with its interactions. par(mar=c(0.1,0.1,0.1,0.1)) plot(TopResults_PPI_PATH, vertex.label.color="black", vertex.frame.color="#ffffff", vertex.size= 20, edge.curved= ifelse(E(TopResults_PPI_PATH)$type == "PPI", 0.4,0), vertex.color = ifelse(igraph::V(TopResults_PPI_PATH)$name == "PIK3R1", "yellow","#00CCFF"),edge.width=0.8, edge.color=ifelse(E(TopResults_PPI_PATH)$type == "PPI", "blue","red")) ## ----multiplexhet1------------------------------------------------------------ ## We keep gene-diseases associations where genes are present in the PPI ## or in the pathway network GeneDiseaseRelations_PPI_PATH <- GeneDiseaseRelations[which(GeneDiseaseRelations$hgnc_symbol %in% PPI_PATH_Multiplex$Pool_of_Nodes),] ## We create the MultiplexHet object. PPI_PATH_Disease_Net <- create.multiplexHet(PPI_PATH_Multiplex, Disease_MultiplexObject, GeneDiseaseRelations_PPI_PATH, c("Disease")) ## The results look like that PPI_PATH_Disease_Net ## ----multiplexhet2------------------------------------------------------------ PPI_PATH_HetTranMatrix <- compute.transition.matrix(PPI_PATH_Disease_Net) ## ----multiplexhet3------------------------------------------------------------ ## We launch the algorithm with the default parameters (See details on manual) RWRMH_PPI_PATH_Disease_Results <- Random.Walk.Restart.MultiplexHet(PPI_PATH_HetTranMatrix, PPI_PATH_Disease_Net,SeedGene,SeedDisease) # We display the results RWRMH_PPI_PATH_Disease_Results ## ----multiplexhet4------------------------------------------------------------ ## In this case we select to induce a network with the Top 10 genes. ## and the Top 10 diseases. TopResults_PPI_PATH_Disease <- create.multiplexHetNetwork.topResults(RWRMH_PPI_PATH_Disease_Results, PPI_PATH_Disease_Net, GeneDiseaseRelations_PPI_PATH, k=10) ## ----Figure 4, fig.width=10, fig.height=5, dpi=300, echo = TRUE, fig.cap="Figure 4: RWR-MH on a multiplex and heterogeneous network (PPI-Pathway-Disease). Network representation of the top 10 ranked genes and the top 10 ranked diseases when the RWR-H algorithm is executed using the PIK3R1 gene and the SHORT syndrome disease (MIM code: 269880) as seeds (yellow nodes). Circular nodes represent genes and rectangular nodes show diseases. Blue curved edges are PPI interactions and red straight edges are Pathways links. Black edges are similarity links between diseases. Dashed edges are the bipartite gene-disease associations. Multiplex interactions are aggregated into a monoplex network only for visualization purposes."---- ## We print that cluster with its interactions. par(mar=c(0.1,0.1,0.1,0.1)) plot(TopResults_PPI_PATH_Disease, vertex.label.color="black", vertex.frame.color="#ffffff", vertex.size= 20, edge.curved=ifelse(E(TopResults_PPI_PATH_Disease)$type == "PATH", 0,0.3), vertex.color = ifelse(V(TopResults_PPI_PATH_Disease)$name == "PIK3R1" | V(TopResults_PPI_Disease)$name == "269880","yellow", ifelse(V(TopResults_PPI_PATH_Disease)$name %in% PPI_PATH_Disease_Net$Multiplex1$Pool_of_Nodes, "#00CCFF","Grey75")), edge.color=ifelse(E(TopResults_PPI_PATH_Disease)$type == "PPI","blue", ifelse(E(TopResults_PPI_PATH_Disease)$type == "PATH","red", ifelse(E(TopResults_PPI_PATH_Disease)$type == "Disease","black","grey50"))), edge.width=0.8, edge.lty=ifelse(E(TopResults_PPI_PATH_Disease)$type == "bipartiteRelations", 2,1), vertex.shape= ifelse(V(TopResults_PPI_PATH_Disease)$name %in% PPI_PATH_Disease_Net$Multiplex1$Pool_of_Nodes,"circle","rectangle")) ## ----fullMultiHet1------------------------------------------------------------ ## I first include aleatory weights in the previously used networks set.seed(124) PPI_Network <- set_edge_attr(PPI_Network,"weight",E(PPI_Network), value = runif(ecount(PPI_Network))) Pathway_Network <- set_edge_attr(Pathway_Network,"weight",E(Pathway_Network), value = runif(ecount(Pathway_Network))) Disease_Network_1 <- set_edge_attr(Disease_Network,"weight",E(Disease_Network), value = runif(ecount(Disease_Network))) ## I am also going to generate a second layer for the disease network ## from random combinations of elements from the disease network (edges) allNames <- V(Disease_Network)$name vectorNames <- t(combn(allNames,2)) idx <- sample(seq(nrow(vectorNames)),size= 10000) Disease_Network_2 <- graph_from_data_frame(as.data.frame(vectorNames[idx,]), directed = FALSE) ## We create the multiplex objects and multiplex heterogeneous objects as ## usually PPI_PATH_Multiplex <- create.multiplex(list(PPI=PPI_Network, PATH=Pathway_Network)) Disease_MultiplexObject <- create.multiplex(list(Disease1=Disease_Network_1, Disease2 = Disease_Network_2)) GeneDiseaseRelations_PPI_PATH <- GeneDiseaseRelations[which(GeneDiseaseRelations$hgnc_symbol %in% PPI_PATH_Multiplex$Pool_of_Nodes),] PPI_PATH_Disease_Net <- create.multiplexHet(PPI_PATH_Multiplex,Disease_MultiplexObject, GeneDiseaseRelations_PPI_PATH) PPI_PATH_HetTranMatrix <- compute.transition.matrix(PPI_PATH_Disease_Net) SeedDisease <- c("269880") SeedGene <- c("PIK3R1") RWRH_PPI_PATH_Disease_Results <- Random.Walk.Restart.MultiplexHet(PPI_PATH_HetTranMatrix, PPI_PATH_Disease_Net,SeedGene,SeedDisease) ## ----fullMultiHet2------------------------------------------------------------ RWRH_PPI_PATH_Disease_Results ## ----sessionInfo, echo=FALSE-------------------------------------------------- sessionInfo()