Contents

1 Introduction

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)
library(magrittr)

2 Initialise OmniPath database

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)

3 Querying drug targets

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)

3.1 Quality control

Check which drug targets are in Omnipath:

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     FALSE       
## 15 Phenytoin      TRUE        
## 16 Tolcapone      FALSE       
## 17 Troglitazone   TRUE        
## 18 Valproic Acid  TRUE        
## 19 Verapamil      TRUE

4 Downstream signaling nodes

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"
    )
)

4.1 Quality control

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

5 Build network between drug targets and POI

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 %>% 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")
## Warning: Using the `size` aesthetic in this geom was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` in the `default_aes` field and elsewhere instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was generated.

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.

6 Acknowledgements

The above pipeline was inspired by the post of Denes Turei available here.

7 References

Appendix

[1] D Turei, A Valdeolivas, L Gul, N Palacio-Escat, M Klein, O Ivanova, M Olbei, A Gabor, F Theis, D Modos, T Korcsmaros and J Saez-Rodriguez (2021) Integrated intra- and intercellular signaling knowledge for multicellular omics analysis. Molecular Systems Biology 17:e9923

[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.

Session info

## 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               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       
## 
## time zone: America/New_York
## tzcode source: system (glibc)
## 
## attached base packages:
## [1] stats     graphics  grDevices utils     datasets  methods   base     
## 
## other attached packages:
## [1] magrittr_2.0.3   ggraph_2.1.0     igraph_1.5.1     ggplot2_3.4.4    dplyr_1.1.3      OmnipathR_3.10.1
## [7] BiocStyle_2.30.0
## 
## loaded via a namespace (and not attached):
##  [1] gtable_0.3.4        xfun_0.40           bslib_0.5.1         ggrepel_0.9.4       tzdb_0.4.0         
##  [6] vctrs_0.6.4         tools_4.3.1         generics_0.1.3      curl_5.1.0          parallel_4.3.1     
## [11] tibble_3.2.1        fansi_1.0.5         pkgconfig_2.0.3     checkmate_2.3.0     readxl_1.4.3       
## [16] lifecycle_1.0.3     farver_2.1.1        compiler_4.3.1      stringr_1.5.0       progress_1.2.2     
## [21] munsell_0.5.0       ggforce_0.4.1       graphlayouts_1.0.1  htmltools_0.5.6.1   sass_0.4.7         
## [26] yaml_2.3.7          later_1.3.1         pillar_1.9.0        crayon_1.5.2        jquerylib_0.1.4    
## [31] tidyr_1.3.0         MASS_7.3-60         cachem_1.0.8        magick_2.8.1        viridis_0.6.4      
## [36] tidyselect_1.2.0    rvest_1.0.3         digest_0.6.33       stringi_1.7.12      purrr_1.0.2        
## [41] bookdown_0.36       labeling_0.4.3      polyclip_1.10-6     fastmap_1.1.1       grid_4.3.1         
## [46] colorspace_2.1-0    cli_3.6.1           logger_0.2.2        tidygraph_1.2.3     utf8_1.2.4         
## [51] readr_2.1.4         withr_2.5.1         prettyunits_1.2.0   scales_1.2.1        backports_1.4.1    
## [56] rappdirs_0.3.3      bit64_4.0.5         lubridate_1.9.3     timechange_0.2.0    rmarkdown_2.25     
## [61] httr_1.4.7          bit_4.0.5           gridExtra_2.3       cellranger_1.1.0    hms_1.1.3          
## [66] evaluate_0.22       knitr_1.44          viridisLite_0.4.2   rlang_1.1.1         Rcpp_1.0.11        
## [71] glue_1.6.2          tweenr_2.0.2        selectr_0.4-2       BiocManager_1.30.22 xml2_1.3.5         
## [76] vroom_1.6.4         jsonlite_1.8.7      R6_2.5.1