OmnipathR 3.2.8
In many applications we would like to understand how a specific drug interacts with the protein signaling network through its targets.
library(dplyr)
library(ggplot2)
library(OmnipathR)
library(igraph)
library(ggraph)
We query protein-protein interactions from the webservice of OmniPath [1,2] at https://omnipathdb.org/ using OmnipathR package:
# Download protein-protein interactions
interactions = import_omnipath_interactions() %>% as_tibble()
# Convert to igraph objects:
OPI_g = interaction_graph(interactions = interactions )
For direct drug targets we will use DrugBank [3] database accessed via the dbparser package. Please note, that the following few chuncks of code is not evaluated. DrugBank requires registrations to access the data, therefore we ask the reader to register at DrugBank and download the data from here.
The next block of code is used to process the DrugBank dataset.
library(dbparser)
library(XML)
## parse data from XML and save it to memory
get_xml_db_rows("..path-to-DrugBank/full database.xml")
## load drugs data
drugs <- parse_drug() %>% select(primary_key, name)
drugs <- rename(drugs,drug_name = name)
## load drug target data
drug_targets <- parse_drug_targets() %>%
select(id, name,organism,parent_key) %>%
rename(target_name = name)
## load polypeptide data
drug_peptides <- parse_drug_targets_polypeptides() %>%
select(id, name, general_function, specific_function,
gene_name, parent_id) %>%
rename(target_name = name, gene_id = id)
# join the 3 datasets
drug_targets_full <- inner_join(drug_targets, drug_peptides,
by=c("id"="parent_id", "target_name")) %>%
inner_join(drugs, by=c("parent_key"="primary_key")) %>%
select(-other_keys)
Here we declare the names of drugs of interest.
drug_names = c("Valproat" = "Valproic Acid",
"Diclofenac" = "Diclofenac",
"Paracetamol" = "Acetaminophen",
"Ciproflaxin" = "Ciprofloxacin",
"Nitrofurantoin"= "Nitrofurantoin",
"Tolcapone",
"Azathioprine",
"Troglitazone",
"Nefazodone",
"Ketoconazole",
"Omeprazole",
"Phenytoin",
"Amiodarone",
"Cisplatin",
"Cyclosporin A" = "Cyclosporine",
"Verapamil",
"Buspirone",
"Melatonin",
"N-Acetylcysteine"= "Acetylcysteine",
"Vitamin C" = "Ascorbic acid",
"Famotidine",
"Vancomycin")
drug_target_data_sample <- drug_targets_full %>%
filter(organism == "Humans",drug_name %in% drug_names)
We only use a small sample of the database:
drug_targets <- OmnipathR:::drug_target_data_sample %>%
filter(organism == "Humans",drug_name %in% drug_names)
Check which drug targets are in Omnipath
drug_targets <- drug_targets %>%
select(-target_name, -organism) %>%
mutate(in_OP = gene_id %in% c(interactions$source))
# not all drug-targets are in OP.
print(all(drug_targets$in_OP))
## [1] FALSE
# But each drug has at least one target in OP.
drug_targets %>% group_by(drug_name) %>% summarise(any(in_OP))
## # A tibble: 19 × 2
## drug_name `any(in_OP)`
## <chr> <lgl>
## 1 Acetaminophen TRUE
## 2 Acetylcysteine TRUE
## 3 Amiodarone TRUE
## 4 Ascorbic acid TRUE
## 5 Azathioprine TRUE
## 6 Buspirone TRUE
## 7 Ciprofloxacin FALSE
## 8 Cisplatin TRUE
## 9 Diclofenac TRUE
## 10 Famotidine TRUE
## 11 Ketoconazole TRUE
## 12 Melatonin TRUE
## 13 Nefazodone TRUE
## 14 Omeprazole TRUE
## 15 Phenytoin TRUE
## 16 Tolcapone FALSE
## 17 Troglitazone TRUE
## 18 Valproic Acid TRUE
## 19 Verapamil TRUE
We would like to investigate the effect of the drugs on some selected proteins. For example, the activity of these proteins are measured upon the drug perturbation. We’ll build a network from the drug targets to these selected nodes.
First we declare protein of interest (POI):
POI = tibble(protein = c("NFE2L2","HMOX1","TP53","CDKN1A","BTG2","NFKB1",
"ICAM1","HSPA5", "ATF4","DDIT3","XBP1"))
Checking which POI are in Omnipath
POI <- POI %>% mutate(in_OP = protein %in% interactions$target_genesymbol)
# all POI is in Omnipath
print(all(POI$in_OP))
## [1] TRUE
First, we find paths between the drug targets and the POIs. For the sake of this simplicity we focus on drug targets of one drug, Cisplatin.
The paths are represented by a set of nodes:
source_nodes <- drug_targets %>%
filter(in_OP, drug_name=="Cisplatin") %>%
pull(gene_name)
target_nodes <- POI %>% filter(in_OP) %>% pull(protein)
collected_path_nodes = list()
for(i_source in 1:length(source_nodes)){
paths <- shortest_paths(OPI_g, from = source_nodes[[i_source]],
to = target_nodes,
output = 'vpath')
path_nodes <- lapply(paths$vpath,names) %>% unlist() %>% unique()
collected_path_nodes[[i_source]] <- path_nodes
}
collected_path_nodes <- unlist(collected_path_nodes) %>% unique()
The direct drug targets, the POIs and the intermediate pathway members give rise to the network.
cisplatin_nodes <- c(source_nodes,target_nodes, collected_path_nodes) %>%
unique()
cisplatin_network <- induced_subgraph(graph = OPI_g,vids = cisplatin_nodes)
We annotate the nodes of the network and plot it.
V(cisplatin_network)$node_type = ifelse(
V(cisplatin_network)$name %in% source_nodes, "direct drug target",
ifelse(
V(cisplatin_network)$name %in% target_nodes,"POI","intermediate node"))
ggraph(
cisplatin_network,
layout = "lgl",
area = vcount(cisplatin_network)^2.3,
repulserad = vcount(cisplatin_network)^1.2,
coolexp = 1.1
) +
geom_edge_link(
aes(
start_cap = label_rect(node1.name),
end_cap = label_rect(node2.name)),
arrow = arrow(length = unit(4, 'mm')
),
edge_width = .5,
edge_alpha = .2
) +
geom_node_point() +
geom_node_label(aes(label = name, color = node_type)) +
scale_color_discrete(
guide = guide_legend(title = 'Node type')
) +
theme_bw() +
xlab("") +
ylab("") +
ggtitle("Cisplatin induced network")
The above network represents a way how Cisplatin can influence the POIs. One can for example filter out edges based on the number fo resources reporting the edge or based on the number of papers mentioning it. However, this is already covered by previous pypath tutorials.
The above pipeline was inspired by the post of Denes Turei available here.
[1] D Turei, A Valdeolivas, L Gul, N Palacio-Escat, O Ivanova, A Gabor, D Modos, T Korcsmaros and J Saez-Rodriguez (2020) Integrated intra- and intercellular signaling knowledge for multicellular omics analysis. bioRxiv 2020.08.03.221242
[2] D Turei, T Korcsmaros and J Saez-Rodriguez (2016) OmniPath: guidelines and gateway for literature-curated signaling pathway resources. Nature Methods 13(12)
[3] Wishart DS, Feunang YD, Guo AC, Lo EJ, Marcu A, Grant JR, Sajed T, Johnson D, Li C, Sayeeda Z, Assempour N, Iynkkaran I, Liu Y, Maciejewski A, Gale N, Wilson A, Chin L, Cummings R, Le D, Pon A, Knox C, Wilson M. DrugBank 5.0: a major update to the DrugBank database for 2018. Nucleic Acids Res. 2017 Nov 8. doi: 10.1093/nar/gkx1037.
## R version 4.1.2 (2021-11-01)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 20.04.3 LTS
##
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.14-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.14-bioc/R/lib/libRlapack.so
##
## locale:
## [1] LC_CTYPE=en_US.UTF-8 LC_NUMERIC=C LC_TIME=en_GB
## [4] LC_COLLATE=C LC_MONETARY=en_US.UTF-8 LC_MESSAGES=en_US.UTF-8
## [7] LC_PAPER=en_US.UTF-8 LC_NAME=C LC_ADDRESS=C
## [10] LC_TELEPHONE=C LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C
##
## attached base packages:
## [1] stats graphics grDevices utils datasets methods base
##
## other attached packages:
## [1] ggraph_2.0.5 igraph_1.2.11 ggplot2_3.3.5 dplyr_1.0.8 OmnipathR_3.2.8 BiocStyle_2.22.0
##
## loaded via a namespace (and not attached):
## [1] ggrepel_0.9.1 Rcpp_1.0.8 tidyr_1.2.0 prettyunits_1.1.1 assertthat_0.2.1
## [6] digest_0.6.29 utf8_1.2.2 ggforce_0.3.3 R6_2.5.1 cellranger_1.1.0
## [11] backports_1.4.1 evaluate_0.15 highr_0.9 httr_1.4.2 pillar_1.7.0
## [16] rlang_1.0.1 progress_1.2.2 curl_4.3.2 readxl_1.3.1 jquerylib_0.1.4
## [21] magick_2.7.3 checkmate_2.0.0 rmarkdown_2.11 labeling_0.4.2 readr_2.1.2
## [26] stringr_1.4.0 polyclip_1.10-0 bit_4.0.4 munsell_0.5.0 compiler_4.1.2
## [31] xfun_0.29 pkgconfig_2.0.3 htmltools_0.5.2 tidyselect_1.1.2 gridExtra_2.3
## [36] tibble_3.1.6 bookdown_0.24 graphlayouts_0.8.0 viridisLite_0.4.0 fansi_1.0.2
## [41] crayon_1.5.0 tzdb_0.2.0 withr_2.4.3 later_1.3.0 MASS_7.3-55
## [46] rappdirs_0.3.3 grid_4.1.2 jsonlite_1.8.0 gtable_0.3.0 lifecycle_1.0.1
## [51] DBI_1.1.2 magrittr_2.0.2 scales_1.1.1 cli_3.2.0 stringi_1.7.6
## [56] vroom_1.5.7 farver_2.1.0 viridis_0.6.2 xml2_1.3.3 logger_0.2.2
## [61] bslib_0.3.1 ellipsis_0.3.2 generics_0.1.2 vctrs_0.3.8 tools_4.1.2
## [66] bit64_4.0.5 glue_1.6.1 tweenr_1.0.2 purrr_0.3.4 hms_1.1.1
## [71] parallel_4.1.2 fastmap_1.1.0 yaml_2.3.5 colorspace_2.0-3 BiocManager_1.30.16
## [76] tidygraph_1.2.0 knitr_1.37 sass_0.4.0